diff --git a/NEWS.md b/NEWS.md index f8c48d88c..3714542c3 100644 --- a/NEWS.md +++ b/NEWS.md @@ -68,7 +68,7 @@ Markdown code with chunks) (@idavydov, #2237). * Package logos will be automatically stripped from the `.Rd` you don't end up with two on one page. (#2083). - * `\figure{file}{alternative text}` with multline alt text is now parsed + * `\figure{file}{alternative text}` with multiline alt text is now parsed correctly (#2080) * roxygen 7.2.0 output for generic code blocks (#2092, @jabenninghoff) is @@ -250,9 +250,9 @@ Markdown code with chunks) (@idavydov, #2237). pkgdown includes translations for: * `es`, Spanish, thanks to @edgararuiz-zz, @dieghernan, @rivaquiroga. - * `de`, German, thnaks to @hfrick. + * `de`, German, thanks to @hfrick. * `fr`, French, thanks to @romainfrancois, @lionel-, @jplecavalier, and @maelle. - * `pt`, Portoguese, thanks to @rich-iannone. + * `pt`, Portuguese, thanks to @rich-iannone. * `tr`, Turkish, thanks to @mine-cetinkaya-rundel. * `zh_CN`, simplified Chinese, thanks to @yitao. @@ -657,7 +657,7 @@ Markdown code with chunks) (@idavydov, #2237). (#1045). * There's much richer control over Open Graph and Twitter metadata for the - whote site and for individual articles. See new `vignette("metadata")` for + whole site and for individual articles. See new `vignette("metadata")` for details (@gadenbuie, #936). * New `deploy_to_branch()` function to build and deploy a site to a branch, diff --git a/R/build-articles.R b/R/build-articles.R index 23dd8be86..32c60612d 100644 --- a/R/build-articles.R +++ b/R/build-articles.R @@ -203,7 +203,7 @@ build_article <- function(name, pkg <- as_pkgdown(pkg) # Look up in pkg vignette data - this allows convenient automatic - # specification of depth, output destination, and other parmaters that + # specification of depth, output destination, and other parameters that # allow code sharing with building of the index. vig <- match(name, pkg$vignettes$name) if (is.na(vig)) { diff --git a/R/build-news.R b/R/build-news.R index a083405e6..27a0fac7a 100644 --- a/R/build-news.R +++ b/R/build-news.R @@ -151,7 +151,7 @@ data_news <- function(pkg = list()) { sections <- xml2::xml_find_all(xml, "./body/div") footnotes <- has_class(sections, "footnotes") if (any(footnotes)) { - warn("Footnotes in NEWS.md are not currently suppoted") + warn("Footnotes in NEWS.md are not currently supported") } sections <- sections[!footnotes] diff --git a/R/topics-external.R b/R/topics-external.R index 1c73c4c01..b51091992 100644 --- a/R/topics-external.R +++ b/R/topics-external.R @@ -23,7 +23,7 @@ ext_topics <- function(match_strings) { ) } -# Adatpted from roxygen2::get_rd_from_help +# Adapted from roxygen2::get_rd_from_help get_rd_from_help <- function(package, alias) { check_installed(package, "as it's used in the reference index.") diff --git a/tests/testthat/_snaps/build-news.md b/tests/testthat/_snaps/build-news.md index 909e9444d..7317c2bec 100644 --- a/tests/testthat/_snaps/build-news.md +++ b/tests/testthat/_snaps/build-news.md @@ -57,5 +57,5 @@ x <- data_news(pkg) Condition Warning: - Footnotes in NEWS.md are not currently suppoted + Footnotes in NEWS.md are not currently supported diff --git a/tests/testthat/assets/search-site/sitemaps-schema-0.9.xsd b/tests/testthat/assets/search-site/sitemaps-schema-0.9.xsd index 6ec9b8a6f..f9565998e 100644 --- a/tests/testthat/assets/search-site/sitemaps-schema-0.9.xsd +++ b/tests/testthat/assets/search-site/sitemaps-schema-0.9.xsd @@ -2,7 +2,7 @@ -XML Schema for Sitemap files. Last Modifed 2008-03-26 +XML Schema for Sitemap files. Last Modified 2008-03-26 diff --git a/tests/testthat/assets/tutorials/vignettes/tutorials/test-1/test-1.Rmd b/tests/testthat/assets/tutorials/vignettes/tutorials/test-1/test-1.Rmd index 35da33685..922a1f3ab 100644 --- a/tests/testthat/assets/tutorials/vignettes/tutorials/test-1/test-1.Rmd +++ b/tests/testthat/assets/tutorials/vignettes/tutorials/test-1/test-1.Rmd @@ -38,7 +38,7 @@ add <- function() { ### Exercise with Hint -*Here's an exercise where the chunk is pre-evaulated via the `exercise.eval` option (so the user can see the default output we'd like them to customize). We also add a "hint" to the correct solution via the chunk immediate below labeled `print-limit-hint`.* +*Here's an exercise where the chunk is pre-evaluated via the `exercise.eval` option (so the user can see the default output we'd like them to customize). We also add a "hint" to the correct solution via the chunk immediate below labeled `print-limit-hint`.* Modify the following code to limit the number of rows printed to 5: diff --git a/tests/testthat/test-highlight.R b/tests/testthat/test-highlight.R index 0eec25d40..852ba5866 100644 --- a/tests/testthat/test-highlight.R +++ b/tests/testthat/test-highlight.R @@ -1,4 +1,4 @@ -test_that("highlight_examples captures depencies", { +test_that("highlight_examples captures dependencies", { withr::defer(unlink(test_path("Rplot001.png"))) dummy_dep <- htmltools::htmlDependency("dummy", "1.0.0", "dummy.js") diff --git a/tests/testthat/test-navbar.R b/tests/testthat/test-navbar.R index d0d33422c..6ab2c4afe 100644 --- a/tests/testthat/test-navbar.R +++ b/tests/testthat/test-navbar.R @@ -21,7 +21,7 @@ test_that("can control articles navbar through articles meta", { pkg_navbar(vignettes = vig, meta = list(...)) } - "Default: show all alpabetically" + "Default: show all alphabetically" expect_snapshot(navbar_articles(pkg())) "No navbar sections: link to index" diff --git a/tests/testthat/test-rd-example.R b/tests/testthat/test-rd-example.R index 94a8e7e5f..c53cd7511 100644 --- a/tests/testthat/test-rd-example.R +++ b/tests/testthat/test-rd-example.R @@ -17,7 +17,7 @@ test_that("inline tags are stripped", { expect_equal(rd2ex("\\dontrun{1}", run_dont_run = TRUE), "1") }) -test_that("blocks get fillers to preserve spacine", { +test_that("blocks get fillers to preserve spacing", { expect_equal(rd2ex("\\donttest{\n 1\n}"), c("# \\donttest{", " 1", "# }")) expect_equal(rd2ex("\\dontrun{\n 1\n}"), c("if (FALSE) {", " 1", "}")) }) diff --git a/tests/testthat/test-rd-html.R b/tests/testthat/test-rd-html.R index 77709ed0f..98a240729 100644 --- a/tests/testthat/test-rd-html.R +++ b/tests/testthat/test-rd-html.R @@ -80,7 +80,7 @@ test_that("support platform specific code", { # tables ------------------------------------------------------------------ -test_that("tabular genereates complete table html", { +test_that("tabular generates complete table html", { table <- "\\tabular{ll}{a \\tab b \\cr}" expectation <- c("", "", "
ab
") expect_equal(rd2html(table), expectation) diff --git a/vignettes/customise.Rmd b/vignettes/customise.Rmd index f69180801..53ea64011 100644 --- a/vignettes/customise.Rmd +++ b/vignettes/customise.Rmd @@ -185,7 +185,7 @@ If you need to include additional HTML, you can add it in the following location template: includes: in_header: - before_body: + before_body: after_body: before_title: diff --git a/vignettes/test/rendering.Rmd b/vignettes/test/rendering.Rmd index a33cdfbfe..1317a5ba8 100644 --- a/vignettes/test/rendering.Rmd +++ b/vignettes/test/rendering.Rmd @@ -163,7 +163,7 @@ Stuff blop -### Tabset without pils {.tabset} +### Tabset without pills {.tabset} #### Tab 1