Skip to content

Commit

Permalink
Update help files to pass HTML5 validation
Browse files Browse the repository at this point in the history
  • Loading branch information
rich-iannone committed Mar 1, 2024
1 parent 3c6f214 commit df09e73
Show file tree
Hide file tree
Showing 25 changed files with 55 additions and 57 deletions.
6 changes: 3 additions & 3 deletions R/col_count_match.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,9 +43,9 @@
#' against the target table in terms of column count values. If supplying a
#' comparison table, it can either be a table object such as a data frame, a
#' tibble, a `tbl_dbi` object, or a `tbl_spark` object. Alternatively, a
#' table-prep formula (`~ <table reading code>`) or a function (`function()
#' <table reading code>`) can be used to lazily read in the comparison table
#' at interrogation time.
#' table-prep formula (`~ <tbl reading code>`) or a function (
#' `function() <tbl reading code>`) can be used to lazily read in the
#' comparison table at interrogation time.
#'
#' @return For the validation function, the return value is either a
#' `ptblank_agent` object or a table object (depending on whether an agent
Expand Down
4 changes: 2 additions & 2 deletions R/col_schema_match.R
Original file line number Diff line number Diff line change
Expand Up @@ -519,8 +519,8 @@ test_col_schema_match <- function(
#' then any values provided to `...` will be ignored. This can either be a
#' table object, a table-prep formula.This can be a table object such as a
#' data frame, a tibble, a `tbl_dbi` object, or a `tbl_spark` object.
#' Alternatively, a table-prep formula (`~ <table reading code>`) or a
#' function (`function() <table reading code>`) can be used to lazily read in
#' Alternatively, a table-prep formula (`~ <tbl reading code>`) or a
#' function (`function() <tbl reading code>`) can be used to lazily read in
#' the table at interrogation time.
#'
#' @param .db_col_types *Use R column types or database column types?*
Expand Down
6 changes: 3 additions & 3 deletions R/create_agent.R
Original file line number Diff line number Diff line change
Expand Up @@ -44,15 +44,15 @@
#'
#' @param tbl *Table or expression for reading in one*
#'
#' `obj:<tbl_*>|<table reading expression>` // **required**
#' `obj:<tbl_*>|<tbl reading expression>` // **required**
#'
#' The input table. This can be a data frame, a tibble, a `tbl_dbi` object, or
#' a `tbl_spark` object. Alternatively, an expression can be supplied to serve
#' as instructions on how to retrieve the target table at interrogation-time.
#' There are two ways to specify an association to a target table: (1) as a
#' table-prep formula, which is a right-hand side (RHS) formula expression
#' (e.g., `~ { <table reading code>}`), or (2) as a function (e.g.,
#' `function() { <table reading code>}`).
#' (e.g., `~ { <tbl reading code>}`), or (2) as a function (e.g.,
#' `function() { <tbl reading code>}`).
#'
#' @param tbl_name *A table name*
#'
Expand Down
6 changes: 3 additions & 3 deletions R/create_informant.R
Original file line number Diff line number Diff line change
Expand Up @@ -55,15 +55,15 @@
#'
#' @param tbl *Table or expression for reading in one*
#'
#' `obj:<tbl_*>|<table reading expression>` // **required**
#' `obj:<tbl_*>|<tbl reading expression>` // **required**
#'
#' The input table. This can be a data frame, a tibble, a `tbl_dbi` object, or
#' a `tbl_spark` object. Alternatively, an expression can be supplied to serve
#' as instructions on how to retrieve the target table at incorporation-time.
#' There are two ways to specify an association to a target table: (1) as a
#' table-prep formula, which is a right-hand side (RHS) formula expression
#' (e.g., `~ { <table reading code>}`), or (2) as a function (e.g.,
#' `function() { <table reading code>}`).
#' (e.g., `~ { <tbl reading code>}`), or (2) as a function (e.g.,
#' `function() { <tbl reading code>}`).
#'
#' @param agent *The pointblank agent object*
#'
Expand Down
2 changes: 1 addition & 1 deletion R/incorporate.R
Original file line number Diff line number Diff line change
Expand Up @@ -207,7 +207,7 @@ incorporate <- function(informant) {
# TODO: Improve the `stop()` message here
stop(
"The `read_fn` object must be a function or an R formula.\n",
"* A function can be made with `function()` {<table reading code>}.\n",
"* A function can be made with `function()` {<tbl reading code>}.\n",
"* An R formula can also be used, with the expression on the RHS.",
call. = FALSE
)
Expand Down
14 changes: 7 additions & 7 deletions R/info_add.R
Original file line number Diff line number Diff line change
Expand Up @@ -246,7 +246,7 @@ info_tabular <- function(
#'
#' @param columns *The target columns*
#'
#' `vector<character>|vars(<columns>)`` // **required**
#' `vector<character>|vars(<columns>)` // **required**
#'
#' The column or set of columns to focus on. Can be defined as a column name
#' in quotes (e.g., `"<column_name>"`), one or more column names in `vars()`
Expand Down Expand Up @@ -723,7 +723,7 @@ check_info_columns_tbl <- function(tbl) {
#'
#' @param section_name *The section name*
#'
#' `scalar<character>`` // **required**
#' `scalar<character>` // **required**
#'
#' The name of the section for which this information pertains.
#'
Expand Down Expand Up @@ -965,7 +965,7 @@ info_section <- function(
#'
#' @param snippet_name *The snippet name*
#'
#' `scalar<character>`` // **required**
#' `scalar<character>` // **required**
#'
#' The name for snippet, which is used for interpolating the result of the
#' snippet formula into *info text* defined by an `info_*()` function.
Expand Down Expand Up @@ -1162,7 +1162,7 @@ info_snippet <- function(
#'
#' @param column *The target column*
#'
#' `scalar<character>`` // **required**
#' `scalar<character>` // **required**
#'
#' The name of the column that contains the target values.
#'
Expand Down Expand Up @@ -1465,7 +1465,7 @@ snip_list <- function(
#'
#' @param column *The target column*
#'
#' `scalar<character>`` // **required**
#' `scalar<character>` // **required**
#'
#' The name of the column that contains the target values.
#'
Expand Down Expand Up @@ -1552,7 +1552,7 @@ snip_stats <- function(
#'
#' @param column *The target column*
#'
#' `scalar<character>`` // **required**
#' `scalar<character>` // **required**
#'
#' The name of the column that contains the target values.
#'
Expand Down Expand Up @@ -1626,7 +1626,7 @@ snip_lowest <- function(column) {
#'
#' @param column *The target column*
#'
#' `scalar<character>`` // **required**
#' `scalar<character>` // **required**
#'
#' The name of the column that contains the target values.
#'
Expand Down
2 changes: 1 addition & 1 deletion R/interrogate.R
Original file line number Diff line number Diff line change
Expand Up @@ -192,7 +192,7 @@ interrogate <- function(
# TODO: create a better `stop()` message
stop(
"The `read_fn` object must be a function or an R formula.\n",
"* A function can be made with `function()` {<table reading code>}.\n",
"* A function can be made with `function()` {<tbl reading code>}.\n",
"* An R formula can also be used, with the expression on the RHS.",
call. = FALSE
)
Expand Down
6 changes: 3 additions & 3 deletions R/object_ops.R
Original file line number Diff line number Diff line change
Expand Up @@ -844,16 +844,16 @@ export_report <- function(
#'
#' @param tbl *Table or expression for reading in one*
#'
#' `obj:<tbl_*>|<table reading expression>` // **required**
#' `obj:<tbl_*>|<tbl reading expression>` // **required**
#'
#' The input table for the *agent* or the *informant*. This can be a data
#' frame, a tibble, a `tbl_dbi` object, or a `tbl_spark` object.
#' Alternatively, an expression can be supplied to serve as instructions on
#' how to retrieve the target table at interrogation- or incorporation-time.
#' There are two ways to specify an association to a target table: (1) as a
#' table-prep formula, which is a right-hand side (RHS) formula expression
#' (e.g., `~ { <table reading code>}`), or (2) as a function (e.g.,
#' `function() { <table reading code>}`).
#' (e.g., `~ { <tbl reading code>}`), or (2) as a function (e.g.,
#' `function() { <tbl reading code>}`).
#'
#' @param tbl_name *A table name*
#'
Expand Down
6 changes: 3 additions & 3 deletions R/row_count_match.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,9 +43,9 @@
#' against the target table in terms of row count values. If supplying a
#' comparison table, it can either be a table object such as a data frame, a
#' tibble, a `tbl_dbi` object, or a `tbl_spark` object. Alternatively, a
#' table-prep formula (`~ <table reading code>`) or a function (`function()
#' <table reading code>`) can be used to lazily read in the comparison table
#' at interrogation time.
#' table-prep formula (`~ <tbl reading code>`) or a function
#' (`function() <tbl reading code>`) can be used to lazily read in the
#' comparison table at interrogation time.
#'
#' @param tbl_compare *[Deprecated] Comparison table*
#'
Expand Down
4 changes: 2 additions & 2 deletions R/tbl_match.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,8 +43,8 @@
#' A table to compare against the target table. This can either be a table
#' object, a table-prep formula. This can be a table object such as a data
#' frame, a tibble, a `tbl_dbi` object, or a `tbl_spark` object.
#' Alternatively, a table-prep formula (`~ <table reading code>`) or a
#' function (`function() <table reading code>`) can be used to lazily read in
#' Alternatively, a table-prep formula (`~ <tbl reading code>`) or a
#' function (`function() <tbl reading code>`) can be used to lazily read in
#' the table at interrogation time.
#'
#' @return For the validation function, the return value is either a
Expand Down
2 changes: 1 addition & 1 deletion R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -199,7 +199,7 @@ materialize_table <- function(tbl, check = TRUE) {
stop(
"The `tbl` object must either be a table, a function, or a formula.\n",
"* A table-prep formula can be used (with the expression on the RHS).\n",
"* A function can be made with `function()` {<table reading code>}.",
"* A function can be made with `function()` {<tbl reading code>}.",
call. = FALSE
)
}
Expand Down
7 changes: 3 additions & 4 deletions man/col_count_match.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/col_schema.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

6 changes: 3 additions & 3 deletions man/create_agent.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

6 changes: 3 additions & 3 deletions man/create_informant.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/info_columns.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/info_section.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/info_snippet.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

7 changes: 3 additions & 4 deletions man/row_count_match.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

6 changes: 3 additions & 3 deletions man/set_tbl.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/snip_highest.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/snip_list.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/snip_lowest.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/snip_stats.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/tbl_match.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit df09e73

Please sign in to comment.