From d672ff632af4079c421a7390afc8cff4722146ca Mon Sep 17 00:00:00 2001 From: olivroy Date: Fri, 6 Sep 2024 09:06:33 -0400 Subject: [PATCH 1/2] Use `
` instead of `` --- NEWS.md | 2 ++ R/render_as_html.R | 14 ++++++++++++-- R/utils_render_html.R | 20 ++++++++++++-------- tests/testthat/test-as_raw_html.R | 2 +- tests/testthat/test-tab_footnote.R | 4 ++-- 5 files changed, 29 insertions(+), 13 deletions(-) diff --git a/NEWS.md b/NEWS.md index 72e9653a1d..b6f6b21b8c 100644 --- a/NEWS.md +++ b/NEWS.md @@ -57,6 +57,8 @@ * Improved footnote rendering in Quarto with `fmt_markdown()` (@olivroy, #1773) +* Improved rendering in Quarto if footnotes and source notes are present (@olivroy, #1296). + # gt 0.11.0 ## New features diff --git a/R/render_as_html.R b/R/render_as_html.R index 722ea24128..8b1a5507e2 100644 --- a/R/render_as_html.R +++ b/R/render_as_html.R @@ -66,6 +66,17 @@ render_as_html <- function(data) { # Create the footnotes component footnotes_component <- create_footnotes_component_h(data = data) + # Create the footer component + if (identical(source_notes_component, "") && identical(footnotes_component, "")) { + # FIXME Put NULL in next PR + footer_component <- "\n " + } else { + footer_component <- htmltools::tags$tfoot( + source_notes_component, + footnotes_component + ) + } + # Get attributes for the gt table table_defs <- get_table_defs(data = data) @@ -90,8 +101,7 @@ render_as_html <- function(data) { table_defs$table_colgroups, table_head, body_component, - source_notes_component, - footnotes_component + footer_component ) } diff --git a/R/utils_render_html.R b/R/utils_render_html.R index ae8471b1ac..f4d0419982 100644 --- a/R/utils_render_html.R +++ b/R/utils_render_html.R @@ -1656,13 +1656,14 @@ create_source_notes_component_h <- function(data) { # Handle the multiline source notes case (each footnote takes up one line) if (multiline) { # Create the source notes component as a series of `` (one per - # source note) inside of a `` + # source note) inside of a `
` return( - htmltools::tags$tfoot( + htmltools::tags$div( class = "gt_sourcenotes", lapply( source_notes, function(x) { + # TODO maybe one of those is not necessary? keep either tr or td? htmltools::tags$tr( htmltools::tags$td( class = "gt_sourcenote", @@ -1682,8 +1683,9 @@ create_source_notes_component_h <- function(data) { separator <- gsub(" (?= )", " ", separator, perl = TRUE) # Create the source notes component as a single `` inside - # of a `` - htmltools::tags$tfoot( + # of a `
` + htmltools::tags$div( + # TODO maybe one of those is not necessary? keep either tr or td? htmltools::tags$tr( class = "gt_sourcenotes", style = source_notes_styles, @@ -1780,13 +1782,14 @@ create_footnotes_component_h <- function(data) { if (multiline) { # Create the footnotes component as a series of `` (one per - # footnote) inside of a `` + # footnote) inside of a `
` return( - htmltools::tags$tfoot( + htmltools::tags$div( class = "gt_footnotes", lapply( footnotes, function(x) { + # TODO maybe one of those is not necessary? keep either tr or td? htmltools::tags$tr( htmltools::tags$td( class = "gt_footnote", @@ -1806,10 +1809,11 @@ create_footnotes_component_h <- function(data) { separator <- gsub(" (?= )", " ", separator, perl = TRUE) # Create the footnotes component as a single `` inside - # of a `` - htmltools::tags$tfoot( + # of a `
` + htmltools::tags$div( htmltools::tags$tr( class = "gt_footnotes", + # TODO maybe one of those is not necessary? keep either tr or td? style = footnotes_styles, htmltools::tags$td( class = "gt_footnote", diff --git a/tests/testthat/test-as_raw_html.R b/tests/testthat/test-as_raw_html.R index f90b21cc4e..d16e1cfdae 100644 --- a/tests/testthat/test-as_raw_html.R +++ b/tests/testthat/test-as_raw_html.R @@ -115,7 +115,7 @@ test_that("as_raw_html() produces the same table every time", { gsub("id=\"[a-z]*?\"", "", .) gt_html_2_sha1 <- digest::sha1(gt_html_2) - expect_equal(gt_html_2_sha1, "86c0738b99e255ed0ca2ed1e7bd52ca3d2e0b78a") + expect_equal(gt_html_2_sha1, "db74df695b885ed0a691fb73a2df9f30a80afee8") # Expect that font family values with multiple words (i.e., have a space # character) added with `tab_style()` preserve single-quote characters diff --git a/tests/testthat/test-tab_footnote.R b/tests/testthat/test-tab_footnote.R index 6316980dfe..fddb43f126 100644 --- a/tests/testthat/test-tab_footnote.R +++ b/tests/testthat/test-tab_footnote.R @@ -312,8 +312,8 @@ test_that("tab_footnote() adds footnote marks for in the summary stub (#1832)", "Summary stub mean sum footnote." ) # Make sure there is a footnote mark in the body (i.e. before the tfoot part) - expect_match_html(tab1, "gt_footnote_marks.+") + expect_match_html(tab2, "gt_footnote_marks.+") }) From 24d9dd437453788bbb34ddc2bbcefdbbda160fde Mon Sep 17 00:00:00 2001 From: olivroy Date: Fri, 6 Sep 2024 09:06:50 -0400 Subject: [PATCH 2/2] Update snapshots --- tests/testthat/_snaps/fmt_markdown.md | 2 +- tests/testthat/_snaps/footer.md | 6 +- tests/testthat/_snaps/group_column_label.md | 64 ++++++++++----------- tests/testthat/_snaps/quarto.md | 2 +- tests/testthat/_snaps/removal_functions.md | 40 ++++++------- tests/testthat/_snaps/tab_footnote.md | 18 +++--- tests/testthat/_snaps/tab_options.md | 8 +-- tests/testthat/_snaps/tab_remove.md | 12 ++-- 8 files changed, 76 insertions(+), 76 deletions(-) diff --git a/tests/testthat/_snaps/fmt_markdown.md b/tests/testthat/_snaps/fmt_markdown.md index b19985416f..422ccd39d8 100644 --- a/tests/testthat/_snaps/fmt_markdown.md +++ b/tests/testthat/_snaps/fmt_markdown.md @@ -3,5 +3,5 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n \n \n \n \n \n \n \n \n \n \n
A Table of Laplace Transforms — \nL\\small{{\\mathcal{L}}}L
The most commonly used Laplace transforms and formulas.

Time Domain
\nf(t)=L1{F(s)}\\small{f\\left( t \\right) = {\\mathcal{L}^{\\,\\, - 1}}\\left\\{ {F\\left( s \\right)} \\right\\}}f(t)=L1{F(s)}
\nsss Domain
\nF(s)=L{f(t)}\\small{F\\left( s \\right) = \\mathcal{L}\\left\\{ {f\\left( t \\right)} \\right\\}}F(s)=L{f(t)}
1\n111\n1s\\frac{1}{s}s1
2\neat{{\\bf{e}}^{a\\,t}}eat\n1sa\\frac{1}{{s - a}}sa1
3\ntn,n=1,2,3,{t^n},\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstn,n=1,2,3,\nn!sn+1\\frac{{n!}}{{{s^{n + 1}}}}sn+1n!
4\ntp,p>1{t^p}, p > -1tp,p>1\nΓ(p+1)sp+1\\frac{{\\Gamma \\left( {p + 1} \\right)}}{{{s^{p + 1}}}}sp+1Γ(p+1)
5\nt\\sqrt tt\nπ2s32\\frac{{\\sqrt \\pi }}{{2{s^{\\frac{3}{2}}}}}2s23π
6\ntn12,n=1,2,3,{t^{n - \\frac{1}{2}}},\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstn21,n=1,2,3,\n135(2n1)π2nsn+12\\frac{{1 \\cdot 3 \\cdot 5 \\cdots \\left( {2n - 1} \\right)\\sqrt \\pi }}{{{2^n}{s^{n + \\frac{1}{2}}}}}2nsn+21135(2n1)π
7\nsin(at)\\sin \\left( {at} \\right)sin(at)\nas2+a2\\frac{a}{{{s^2} + {a^2}}}s2+a2a
8\ncos(at)\\cos \\left( {at} \\right)cos(at)\nss2+a2\\frac{s}{{{s^2} + {a^2}}}s2+a2s
9\ntsin(at)t\\sin \\left( {at} \\right)tsin(at)\n2as(s2+a2)2\\frac{{2as}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)22as
10\ntcos(at)t\\cos \\left( {at} \\right)tcos(at)\ns2a2(s2+a2)2\\frac{{{s^2} - {a^2}}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)2s2a2
11\nsin(at)atcos(at)\\sin \\left( {at} \\right) - at\\cos \\left( {at} \\right)sin(at)atcos(at)\n2a3(s2+a2)2\\frac{{2{a^3}}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)22a3
12\nsin(at)+atcos(at)\\sin \\left( {at} \\right) + at\\cos \\left( {at} \\right)sin(at)+atcos(at)\n2as2(s2+a2)2\\frac{{2a{s^2}}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)22as2
13\ncos(at)atsin(at)\\cos \\left( {at} \\right) - at\\sin \\left( {at} \\right)cos(at)atsin(at)\ns(s2a2)(s2+a2)2\\frac{{s\\left( {{s^2} - {a^2}} \\right)}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)2s(s2a2)
14\ncos(at)+atsin(at)\\cos \\left( {at} \\right) + at\\sin \\left( {at} \\right)cos(at)+atsin(at)\ns(s2+3a2)(s2+a2)2\\frac{{s\\left( {{s^2} + 3{a^2}} \\right)}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)2s(s2+3a2)
15\nsin(at+b)\\sin \\left( {at + b} \\right)sin(at+b)\nssin(b)+acos(b)s2+a2\\frac{{s\\sin \\left( b \\right) + a\\cos \\left( b \\right)}}{{{s^2} + {a^2}}}s2+a2ssin(b)+acos(b)
16\ncos(at+b)\\cos \\left( {at + b} \\right)cos(at+b)\nscos(b)asin(b)s2+a2\\frac{{s\\cos \\left( b \\right) - a\\sin \\left( b \\right)}}{{{s^2} + {a^2}}}s2+a2scos(b)asin(b)
17\nsinh(at)\\sinh \\left( {at} \\right)sinh(at)\nas2a2\\frac{a}{{{s^2} - {a^2}}}s2a2a
18\ncosh(at)\\cosh \\left( {at} \\right)cosh(at)\nss2a2\\frac{s}{{{s^2} - {a^2}}}s2a2s
19\neatsin(bt){{\\bf{e}}^{at}}\\sin \\left( {bt} \\right)eatsin(bt)\nb(sa)2+b2\\frac{b}{{{{\\left( {s - a} \\right)}^2} + {b^2}}}(sa)2+b2b
20\neatcos(bt){{\\bf{e}}^{at}}\\cos \\left( {bt} \\right)eatcos(bt)\nsa(sa)2+b2\\frac{{s - a}}{{{{\\left( {s - a} \\right)}^2} + {b^2}}}(sa)2+b2sa
21\neatsinh(bt){{\\bf{e}}^{at}}\\sinh \\left( {bt} \\right)eatsinh(bt)\nb(sa)2b2\\frac{b}{{{{\\left( {s - a} \\right)}^2} - {b^2}}}(sa)2b2b
22\neatcosh(bt){{\\bf{e}}^{at}}\\cosh \\left( {bt} \\right)eatcosh(bt)\nsa(sa)2b2\\frac{{s - a}}{{{{\\left( {s - a} \\right)}^2} - {b^2}}}(sa)2b2sa
23\ntneat,n=1,2,3,{t^n}{{\\bf{e}}^{at}},\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstneat,n=1,2,3,\nn!(sa)n+1\\frac{{n!}}{{{{\\left( {s - a} \\right)}^{n + 1}}}}(sa)n+1n!
24\nf(ct)f\\left( {ct} \\right)f(ct)\n1cF(sc)\\frac{1}{c}F\\left( {\\frac{s}{c}} \\right)c1F(cs)
25\nuc(t)=u(tc){u_c}\\left( t \\right) = u\\left( {t - c} \\right)uc(t)=u(tc)[1]\necss\\frac{{{{\\bf{e}}^{ - cs}}}}{s}secs
26\nδ(tc)\\delta \\left( {t - c} \\right)δ(tc)[2]\necs{{\\bf{e}}^{ - cs}}ecs
27\nuc(t)f(tc){u_c}\\left( t \\right)f\\left( {t - c} \\right)uc(t)f(tc)\necsF(s){{\\bf{e}}^{ - cs}}F\\left( s \\right)ecsF(s)
28\nuc(t)g(t){u_c}\\left( t \\right)g\\left( t \\right)uc(t)g(t)\necsL{g(t+c)}{{\\bf{e}}^{ - cs}}{\\mathcal{L}}\\left\\{ {g\\left( {t + c} \\right)} \\right\\}ecsL{g(t+c)}
29\nectf(t){{\\bf{e}}^{ct}}f\\left( t \\right)ectf(t)\nF(sc)F\\left( {s - c} \\right)F(sc)
30\ntnf(t),n=1,2,3,{t^n}f\\left( t \\right),\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstnf(t),n=1,2,3,\n(1)nF(n)(s){\\left( { - 1} \\right)^n}{F^{\\left( n \\right)}}\\left( s \\right)(1)nF(n)(s)
31\n1tf(t)\\displaystyle \\frac{1}{t}f\\left( t \\right)t1f(t)\nsF(u)du\\int_{{\\,s}}^{{\\,\\infty }}{{F\\left( u \\right)\\,du}}sF(u)du
32\n0tf(v)dv\\displaystyle \\int_{{\\,0}}^{{\\,t}}{{\\,f\\left( v \\right)\\,dv}}0tf(v)dv\nF(s)s\\displaystyle \\frac{{F\\left( s \\right)}}{s}sF(s)
33\n0tf(tτ)g(τ)dτ\\displaystyle \\int_{{\\,0}}^{{\\,t}}{{f\\left( {t - \\tau } \\right)g\\left( \\tau \\right)\\,d\\tau }}0tf(tτ)g(τ)dτ\nF(s)G(s)F\\left( s \\right)G\\left( s \\right)F(s)G(s)
34\nf(t+T)=f(t)f\\left( {t + T} \\right) = f\\left( t \\right)f(t+T)=f(t)\n0Testf(t)dt1esT\\displaystyle \\frac{{\\displaystyle \\int_{{\\,0}}^{{\\,T}}{{{{\\bf{e}}^{ - st}}f\\left( t \\right)\\,dt}}}}{{1 - {{\\bf{e}}^{ - sT}}}}1esT0Testf(t)dt
35\nf(t)f'\\left( t \\right)f(t)\nsF(s)f(0)sF\\left( s \\right) - f\\left( 0 \\right)sF(s)f(0)
36\nf(t)f''\\left( t \\right)f′′(t)\ns2F(s)sf(0)f(0){s^2}F\\left( s \\right) - sf\\left( 0 \\right) - f'\\left( 0 \\right)s2F(s)sf(0)f(0)
37\nf(n)(t){f^{\\left( n \\right)}}\\left( t \\right)f(n)(t)\nsnF(s)sn1f(0)sn2f(0)sf(n2)(0)f(n1)(0){s^n}F\\left( s \\right) - {s^{n - 1}}f\\left( 0 \\right) - {s^{n - 2}}f'\\left( 0 \\right) \\cdots - s{f^{\\left( {n - 2} \\right)}}\\left( 0 \\right) - {f^{\\left( {n - 1} \\right)}}\\left( 0 \\right)snF(s)sn1f(0)sn2f(0)sf(n2)(0)f(n1)(0)
The hyperbolic functions: \ncosh(t)=et+et2\\cosh \\left( t \\right) = \\frac{{{{\\bf{e}}^t} + {{\\bf{e}}^{ - t}}}}{2}cosh(t)=2et+et , \nsinh(t)=etet2\\sinh \\left( t \\right) = \\frac{{{{\\bf{e}}^t} - {{\\bf{e}}^{ - t}}}}{2}sinh(t)=2etet
\n
1 The Heaviside Function. 2 The Dirac Delta Function.
\n
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
A Table of Laplace Transforms — \nL\\small{{\\mathcal{L}}}L
The most commonly used Laplace transforms and formulas.

Time Domain
\nf(t)=L1{F(s)}\\small{f\\left( t \\right) = {\\mathcal{L}^{\\,\\, - 1}}\\left\\{ {F\\left( s \\right)} \\right\\}}f(t)=L1{F(s)}
\nsss Domain
\nF(s)=L{f(t)}\\small{F\\left( s \\right) = \\mathcal{L}\\left\\{ {f\\left( t \\right)} \\right\\}}F(s)=L{f(t)}
1\n111\n1s\\frac{1}{s}s1
2\neat{{\\bf{e}}^{a\\,t}}eat\n1sa\\frac{1}{{s - a}}sa1
3\ntn,n=1,2,3,{t^n},\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstn,n=1,2,3,\nn!sn+1\\frac{{n!}}{{{s^{n + 1}}}}sn+1n!
4\ntp,p>1{t^p}, p > -1tp,p>1\nΓ(p+1)sp+1\\frac{{\\Gamma \\left( {p + 1} \\right)}}{{{s^{p + 1}}}}sp+1Γ(p+1)
5\nt\\sqrt tt\nπ2s32\\frac{{\\sqrt \\pi }}{{2{s^{\\frac{3}{2}}}}}2s23π
6\ntn12,n=1,2,3,{t^{n - \\frac{1}{2}}},\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstn21,n=1,2,3,\n135(2n1)π2nsn+12\\frac{{1 \\cdot 3 \\cdot 5 \\cdots \\left( {2n - 1} \\right)\\sqrt \\pi }}{{{2^n}{s^{n + \\frac{1}{2}}}}}2nsn+21135(2n1)π
7\nsin(at)\\sin \\left( {at} \\right)sin(at)\nas2+a2\\frac{a}{{{s^2} + {a^2}}}s2+a2a
8\ncos(at)\\cos \\left( {at} \\right)cos(at)\nss2+a2\\frac{s}{{{s^2} + {a^2}}}s2+a2s
9\ntsin(at)t\\sin \\left( {at} \\right)tsin(at)\n2as(s2+a2)2\\frac{{2as}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)22as
10\ntcos(at)t\\cos \\left( {at} \\right)tcos(at)\ns2a2(s2+a2)2\\frac{{{s^2} - {a^2}}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)2s2a2
11\nsin(at)atcos(at)\\sin \\left( {at} \\right) - at\\cos \\left( {at} \\right)sin(at)atcos(at)\n2a3(s2+a2)2\\frac{{2{a^3}}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)22a3
12\nsin(at)+atcos(at)\\sin \\left( {at} \\right) + at\\cos \\left( {at} \\right)sin(at)+atcos(at)\n2as2(s2+a2)2\\frac{{2a{s^2}}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)22as2
13\ncos(at)atsin(at)\\cos \\left( {at} \\right) - at\\sin \\left( {at} \\right)cos(at)atsin(at)\ns(s2a2)(s2+a2)2\\frac{{s\\left( {{s^2} - {a^2}} \\right)}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)2s(s2a2)
14\ncos(at)+atsin(at)\\cos \\left( {at} \\right) + at\\sin \\left( {at} \\right)cos(at)+atsin(at)\ns(s2+3a2)(s2+a2)2\\frac{{s\\left( {{s^2} + 3{a^2}} \\right)}}{{{{\\left( {{s^2} + {a^2}} \\right)}^2}}}(s2+a2)2s(s2+3a2)
15\nsin(at+b)\\sin \\left( {at + b} \\right)sin(at+b)\nssin(b)+acos(b)s2+a2\\frac{{s\\sin \\left( b \\right) + a\\cos \\left( b \\right)}}{{{s^2} + {a^2}}}s2+a2ssin(b)+acos(b)
16\ncos(at+b)\\cos \\left( {at + b} \\right)cos(at+b)\nscos(b)asin(b)s2+a2\\frac{{s\\cos \\left( b \\right) - a\\sin \\left( b \\right)}}{{{s^2} + {a^2}}}s2+a2scos(b)asin(b)
17\nsinh(at)\\sinh \\left( {at} \\right)sinh(at)\nas2a2\\frac{a}{{{s^2} - {a^2}}}s2a2a
18\ncosh(at)\\cosh \\left( {at} \\right)cosh(at)\nss2a2\\frac{s}{{{s^2} - {a^2}}}s2a2s
19\neatsin(bt){{\\bf{e}}^{at}}\\sin \\left( {bt} \\right)eatsin(bt)\nb(sa)2+b2\\frac{b}{{{{\\left( {s - a} \\right)}^2} + {b^2}}}(sa)2+b2b
20\neatcos(bt){{\\bf{e}}^{at}}\\cos \\left( {bt} \\right)eatcos(bt)\nsa(sa)2+b2\\frac{{s - a}}{{{{\\left( {s - a} \\right)}^2} + {b^2}}}(sa)2+b2sa
21\neatsinh(bt){{\\bf{e}}^{at}}\\sinh \\left( {bt} \\right)eatsinh(bt)\nb(sa)2b2\\frac{b}{{{{\\left( {s - a} \\right)}^2} - {b^2}}}(sa)2b2b
22\neatcosh(bt){{\\bf{e}}^{at}}\\cosh \\left( {bt} \\right)eatcosh(bt)\nsa(sa)2b2\\frac{{s - a}}{{{{\\left( {s - a} \\right)}^2} - {b^2}}}(sa)2b2sa
23\ntneat,n=1,2,3,{t^n}{{\\bf{e}}^{at}},\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstneat,n=1,2,3,\nn!(sa)n+1\\frac{{n!}}{{{{\\left( {s - a} \\right)}^{n + 1}}}}(sa)n+1n!
24\nf(ct)f\\left( {ct} \\right)f(ct)\n1cF(sc)\\frac{1}{c}F\\left( {\\frac{s}{c}} \\right)c1F(cs)
25\nuc(t)=u(tc){u_c}\\left( t \\right) = u\\left( {t - c} \\right)uc(t)=u(tc)[1]\necss\\frac{{{{\\bf{e}}^{ - cs}}}}{s}secs
26\nδ(tc)\\delta \\left( {t - c} \\right)δ(tc)[2]\necs{{\\bf{e}}^{ - cs}}ecs
27\nuc(t)f(tc){u_c}\\left( t \\right)f\\left( {t - c} \\right)uc(t)f(tc)\necsF(s){{\\bf{e}}^{ - cs}}F\\left( s \\right)ecsF(s)
28\nuc(t)g(t){u_c}\\left( t \\right)g\\left( t \\right)uc(t)g(t)\necsL{g(t+c)}{{\\bf{e}}^{ - cs}}{\\mathcal{L}}\\left\\{ {g\\left( {t + c} \\right)} \\right\\}ecsL{g(t+c)}
29\nectf(t){{\\bf{e}}^{ct}}f\\left( t \\right)ectf(t)\nF(sc)F\\left( {s - c} \\right)F(sc)
30\ntnf(t),n=1,2,3,{t^n}f\\left( t \\right),\\,\\,\\,\\,\\,n = 1,2,3, \\ldotstnf(t),n=1,2,3,\n(1)nF(n)(s){\\left( { - 1} \\right)^n}{F^{\\left( n \\right)}}\\left( s \\right)(1)nF(n)(s)
31\n1tf(t)\\displaystyle \\frac{1}{t}f\\left( t \\right)t1f(t)\nsF(u)du\\int_{{\\,s}}^{{\\,\\infty }}{{F\\left( u \\right)\\,du}}sF(u)du
32\n0tf(v)dv\\displaystyle \\int_{{\\,0}}^{{\\,t}}{{\\,f\\left( v \\right)\\,dv}}0tf(v)dv\nF(s)s\\displaystyle \\frac{{F\\left( s \\right)}}{s}sF(s)
33\n0tf(tτ)g(τ)dτ\\displaystyle \\int_{{\\,0}}^{{\\,t}}{{f\\left( {t - \\tau } \\right)g\\left( \\tau \\right)\\,d\\tau }}0tf(tτ)g(τ)dτ\nF(s)G(s)F\\left( s \\right)G\\left( s \\right)F(s)G(s)
34\nf(t+T)=f(t)f\\left( {t + T} \\right) = f\\left( t \\right)f(t+T)=f(t)\n0Testf(t)dt1esT\\displaystyle \\frac{{\\displaystyle \\int_{{\\,0}}^{{\\,T}}{{{{\\bf{e}}^{ - st}}f\\left( t \\right)\\,dt}}}}{{1 - {{\\bf{e}}^{ - sT}}}}1esT0Testf(t)dt
35\nf(t)f'\\left( t \\right)f(t)\nsF(s)f(0)sF\\left( s \\right) - f\\left( 0 \\right)sF(s)f(0)
36\nf(t)f''\\left( t \\right)f′′(t)\ns2F(s)sf(0)f(0){s^2}F\\left( s \\right) - sf\\left( 0 \\right) - f'\\left( 0 \\right)s2F(s)sf(0)f(0)
37\nf(n)(t){f^{\\left( n \\right)}}\\left( t \\right)f(n)(t)\nsnF(s)sn1f(0)sn2f(0)sf(n2)(0)f(n1)(0){s^n}F\\left( s \\right) - {s^{n - 1}}f\\left( 0 \\right) - {s^{n - 2}}f'\\left( 0 \\right) \\cdots - s{f^{\\left( {n - 2} \\right)}}\\left( 0 \\right) - {f^{\\left( {n - 1} \\right)}}\\left( 0 \\right)snF(s)sn1f(0)sn2f(0)sf(n2)(0)f(n1)(0)
The hyperbolic functions: \ncosh(t)=et+et2\\cosh \\left( t \\right) = \\frac{{{{\\bf{e}}^t} + {{\\bf{e}}^{ - t}}}}{2}cosh(t)=2et+et , \nsinh(t)=etet2\\sinh \\left( t \\right) = \\frac{{{{\\bf{e}}^t} - {{\\bf{e}}^{ - t}}}}{2}sinh(t)=2etet
\n
1 The Heaviside Function. 2 The Dirac Delta Function.
\n
" diff --git a/tests/testthat/_snaps/footer.md b/tests/testthat/_snaps/footer.md index 8d4be23546..b03a2a07c5 100644 --- a/tests/testthat/_snaps/footer.md +++ b/tests/testthat/_snaps/footer.md @@ -3,7 +3,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
num1char2fctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
Source note **bold** (#1, no `md()`)
Source note bold (#2, uses md())
1 footnote **bold** (#1, no `md()`)
2 footnote bold (#2, uses md())
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
num1char2fctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
Source note **bold** (#1, no `md()`)
Source note bold (#2, uses md())
1 footnote **bold** (#1, no `md()`)
2 footnote bold (#2, uses md())
" --- @@ -107,7 +107,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n
num1char2fctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
\n
Source note **bold** (#1, no `md()`)  Source note bold (#2, uses md())
\n
\n
1 footnote **bold** (#1, no `md()`)  2 footnote bold (#2, uses md())
\n
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
num1char2fctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
\n
Source note **bold** (#1, no `md()`)  Source note bold (#2, uses md())
\n
\n
1 footnote **bold** (#1, no `md()`)  2 footnote bold (#2, uses md())
\n
" --- @@ -211,7 +211,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n
num1char2fctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
\n
Source note **bold** (#1, no `md()`) | Source note bold (#2, uses md())
\n
\n
1 footnote **bold** (#1, no `md()`) | 2 footnote bold (#2, uses md())
\n
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
num1char2fctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
\n
Source note **bold** (#1, no `md()`) | Source note bold (#2, uses md())
\n
\n
1 footnote **bold** (#1, no `md()`) | 2 footnote bold (#2, uses md())
\n
" --- diff --git a/tests/testthat/_snaps/group_column_label.md b/tests/testthat/_snaps/group_column_label.md index 43e4e91f2d..f2f84149fd 100644 --- a/tests/testthat/_snaps/group_column_label.md +++ b/tests/testthat/_snaps/group_column_label.md @@ -3,7 +3,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" --- @@ -355,7 +355,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" --- @@ -707,7 +707,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" --- @@ -1043,7 +1043,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" --- @@ -1395,7 +1395,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" --- @@ -1747,7 +1747,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" --- @@ -2099,7 +2099,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" --- @@ -2435,7 +2435,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" --- @@ -2787,7 +2787,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -3271,7 +3271,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -3755,7 +3755,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -4400,7 +4400,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -5031,7 +5031,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -5476,7 +5476,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -5921,7 +5921,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -6509,7 +6509,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- @@ -7140,112 +7140,112 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrowgroup
datetimedatetime
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencyrow
datetimedatetime
grp_a1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currencygroup
datetimedatetime
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950grp_a
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950grp_a
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390grp_a
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000grp_a
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810grp_b
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255grp_b
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NAgrp_b
row_88.880e+06honeydeweight2015-08-1520:20NA0.440grp_b
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
Data listing from exibble
exibble is an R dataset
S.L.numcharfctr\n
timing
\n
currency
datetimedatetime
grp_arow_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065100.00
avg120.0216292.32
grp_brow_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
min5550.000.44
max8880000.001325.81
avg3220850.00446.50
min0.110.44
max8880000.0065100.00
avg1380432.879501.26
Source note #1
Source note #2
" # Group labels as a column work well in Latex with specified column widths diff --git a/tests/testthat/_snaps/quarto.md b/tests/testthat/_snaps/quarto.md index 10e0ec537c..2a4b0f7cf2 100644 --- a/tests/testthat/_snaps/quarto.md +++ b/tests/testthat/_snaps/quarto.md @@ -3,5 +3,5 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n
title
num\n
problem
\n
char1Factor2
3 0.1111apricotone
2.222bananatwo
33.33coconutthree
444.4durianfour
5550NAfive
1 Not a problem
2 A problem because fctr is labelled with md
3 Problem because num row 1 is fmt_markdown() + also the footnote is wrapped in md.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n \n\n\n \n\n\n \n\n\n \n\n\n \n \n \n
\n
\n \n \n \n \n \n \n \n \n \n \n
title
num\n
problem
\n
char1Factor2
3 0.1111apricotone
2.222bananatwo
33.33coconutthree
444.4durianfour
5550NAfive
1 Not a problem
2 A problem because fctr is labelled with md
3 Problem because num row 1 is fmt_markdown() + also the footnote is wrapped in md.
" diff --git a/tests/testthat/_snaps/removal_functions.md b/tests/testthat/_snaps/removal_functions.md index 5e04bce590..1ef788abce 100644 --- a/tests/testthat/_snaps/removal_functions.md +++ b/tests/testthat/_snaps/removal_functions.md @@ -3,138 +3,138 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Labelnumcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Labelnumcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
datetimedatetime\n
Numbers
\n
numcharfctrcurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
datetimedatetime\n
Numbers
\n
numcharfctrcurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Labelnum\n
Words
\n
\n
Date and Time
\n
currency
charfctrdatetimedatetime
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Labelnum\n
Words
\n
\n
Date and Time
\n
currency
charfctrdatetimedatetime
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
charfctr\n
Date and Time
\n
\n
Numbers
\n
numdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
charfctr\n
Date and Time
\n
\n
Numbers
\n
numdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Grand Spanner
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Grand Spanner
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Grand Spanner
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Grand Spanner
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Labelnumcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
A Stubhead Labelnumcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_21 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_21 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n \n \n \n
This is a caption
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
1 This is a footnote.
2 This is a second footnote.
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n \n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n
\n
\n \n \n \n \n \n \n \n
The title of the table
The table's subtitle
\n
Grand Spanner
\n
A Stubhead Label\n
Numbers
\n
\n
Words
\n
\n
Date and Time
\n
\n
Numbers
\n
numcharfctrdatetimedatetimecurrency
grp_a
row_11 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950
row_22 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950
row_33.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390
row_44.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000
min0.111.39
max444.4065,100.00
grp_b
row_55.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810
row_6NAfigsix2015-06-15NA2018-06-06 16:1113.255
row_77.770e+05grapefruitsevenNA19:102018-07-07 05:22NA
row_88.880e+06honeydeweight2015-08-1520:20NA0.440
total66,509
This is a source note.
This is a second source note.
1 This is a footnote.
2 This is a second footnote.
" diff --git a/tests/testthat/_snaps/tab_footnote.md b/tests/testthat/_snaps/tab_footnote.md index 358a2c3ab4..201204972b 100644 --- a/tests/testthat/_snaps/tab_footnote.md +++ b/tests/testthat/_snaps/tab_footnote.md @@ -3,7 +3,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
A footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
A footnote.
" --- @@ -100,7 +100,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
A footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
A footnote.
" --- @@ -197,7 +197,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
A footnote.
1 A footnote.
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
A footnote.
1 A footnote.
" --- @@ -294,7 +294,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
\n
A footnote. A second footnote. 1 location note
\n
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 0.1111apricotone2015-01-1513:352018-01-01 02:2249.95row_1grp_a
\n
A footnote. A second footnote. 1 location note
\n
" --- @@ -391,35 +391,35 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
char
apricot1
1 note
" + [1] "\n \n \n \n \n \n \n \n \n \n \n
\n
\n \n \n \n \n
char
apricot1
1 note
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
char
1 apricot
1 note
" + [1] "\n \n \n \n \n \n \n \n \n \n \n
\n
\n \n \n \n \n
char
1 apricot
1 note
" # Footnotes are correctly placed with text produced by `fmt_markdown()` in Quarto (#1773) Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
char
apricot1
1 note
" + [1] "\n \n \n \n \n \n \n \n \n \n \n
\n
\n \n \n \n \n
char
apricot1
1 note
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n
char
1 apricot
1 note
" + [1] "\n \n \n \n \n \n \n \n \n \n \n
\n
\n \n \n \n \n
char
1 apricot
1 note
" # Footnotes work with group labels in 2-column stub arrangements Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n\n\n \n\n \n\n \n\n \n\n\n \n\n \n\n \n\n \n \n \n \n \n \n \n
Pizzas Sold
peppr_salami1L696
M428
S322
sum1,446
soppressataL405
M268
S288
sum961
1 The Pepper-Salami.
" + [1] "\n \n \n \n \n \n \n \n \n\n\n \n\n \n\n \n\n \n\n\n \n\n \n\n \n\n \n \n \n
\n
\n \n \n \n \n
Pizzas Sold
peppr_salami1L696
M428
S322
sum1,446
soppressataL405
M268
S288
sum961
1 The Pepper-Salami.
" --- diff --git a/tests/testthat/_snaps/tab_options.md b/tests/testthat/_snaps/tab_options.md index 74be9e6f4f..50e4c17618 100644 --- a/tests/testthat/_snaps/tab_options.md +++ b/tests/testthat/_snaps/tab_options.md @@ -3,26 +3,26 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n
\n
\n \n \n \n \n
The mtcars Dataset1
What a great dataset this is
mpgcyl\n
performance
\n
wtqsecvsamgearcarb
disphpdrat
Mazda RX421.061601103.902.62016.460144
Mazda RX4 Wag21.061601103.902.87517.020144
Datsun 71022.84108933.852.32018.611141
Hornet 4 Drive21.462581103.083.21519.441031
Hornet Sportabout18.783601753.153.44017.020032
Dataset is generally available in R
1 A table footnote
" diff --git a/tests/testthat/_snaps/tab_remove.md b/tests/testthat/_snaps/tab_remove.md index 8efdc8bb22..e379ac33db 100644 --- a/tests/testthat/_snaps/tab_remove.md +++ b/tests/testthat/_snaps/tab_remove.md @@ -122,7 +122,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
1 Footnote 1
2 Footnote 2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
1 Footnote 1
2 Footnote 2
" --- @@ -136,14 +136,14 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
1 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
1 Footnote 2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
1 2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
1 Footnote 2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
1 Footnote 1
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n
\n
\n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1 1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
1 Footnote 1
" --- @@ -170,7 +170,7 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source Note 1
Source Note 2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source Note 1
Source Note 2
" --- @@ -184,14 +184,14 @@ Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source Note 2
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source Note 2
" --- Code render_as_html(gt_tbl) Output - [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source Note 1
" + [1] "\n \n \n \n \n \n \n \n \n \n \n \n \n \n \n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n\n\n\n\n\n\n\n\n \n \n
\n
\n \n \n \n \n \n
numcharfctrdatetimedatetimecurrencyrowgroup
1.111e-01apricotone2015-01-1513:352018-01-01 02:2249.950row_1grp_a
2.222e+00bananatwo2015-02-1514:402018-02-02 14:3317.950row_2grp_a
3.333e+01coconutthree2015-03-1515:452018-03-03 03:441.390row_3grp_a
4.444e+02durianfour2015-04-1516:502018-04-04 15:5565100.000row_4grp_a
5.550e+03NAfive2015-05-1517:552018-05-05 04:001325.810row_5grp_b
NAfigsix2015-06-15NA2018-06-06 16:1113.255row_6grp_b
7.770e+05grapefruitsevenNA19:102018-07-07 05:22NArow_7grp_b
8.880e+06honeydeweight2015-08-1520:20NA0.440row_8grp_b
Source Note 1
" ---