Skip to content

Commit

Permalink
Passed tests and build site with wort()
Browse files Browse the repository at this point in the history
  • Loading branch information
ncondits3 committed Feb 15, 2024
1 parent 672b356 commit 6ccad1b
Show file tree
Hide file tree
Showing 146 changed files with 371 additions and 282 deletions.
7 changes: 6 additions & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -655,7 +655,12 @@ importFrom(numbers,primeFactors)
importFrom(rlang,"%|%")
importFrom(rlang,"%||%")
importFrom(scales,ContinuousRange)
importFrom(stringi,stri_enc_detect2)
importFrom(stringi,stri_enc_detect)
importFrom(stringi,stri_enc_isascii)
importFrom(stringi,stri_enc_isutf16be)
importFrom(stringi,stri_enc_isutf16le)
importFrom(stringi,stri_enc_isutf32be)
importFrom(stringi,stri_enc_isutf8)
importFrom(stringi,stri_read_raw)
importFrom(stringi,stri_trans_totitle)
importFrom(stringr,str_count)
Expand Down
2 changes: 1 addition & 1 deletion R/Chords.R
Original file line number Diff line number Diff line change
Expand Up @@ -1453,7 +1453,7 @@ makeChordTransformer <- function(deparser, callname, outputClass = 'character',
deparse <- args...$deparse %||% TRUE

# Parse
parsedTset <- do(tertianSet, c(list(x, memoize = memoize), parseArgs), memoize = memoize, outputClass = 'tertianSet')
parsedTset <- do(tertianSet, c(list(x), parseArgs), memoize = memoize, outputClass = 'tertianSet')
if (length(transposeArgs) > 0L && is.tertianSet(parsedTset)) {
parsedTset <- do(transpose.tertianSet, c(list(parsedTset), transposeArgs))
}
Expand Down
2 changes: 1 addition & 1 deletion R/Lyrics.R
Original file line number Diff line number Diff line change
Expand Up @@ -36,7 +36,7 @@ silbe2wort <- function(x, sep = '-', keep.sep = TRUE, number.syllables = FALSE,
wort
}

#' Paste sylllables together into words
#' Paste syllables together into words
#'
#' Most humdrum datasets which include lyrics, include them in a `**silbe` spine, representing each syllable from the lyrics on
#' one so they line up with notes in the music.
Expand Down
2 changes: 1 addition & 1 deletion R/Pitch.R
Original file line number Diff line number Diff line change
Expand Up @@ -408,7 +408,7 @@ setMethod('+', signature = c('tonalInterval', 'numeric'),

setMethod('+', signature = c('character', 'tonalInterval'),
function(e1, e2) {
e1 <- tonalInterval.character(e1, memoize = FALSE)
e1 <- tonalInterval.character(e1)

e3 <- e1 + e2
dispatch <- attr(e1, 'dispatch')
Expand Down
4 changes: 2 additions & 2 deletions docs/articles/ComplexSyntax.html

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

2 changes: 1 addition & 1 deletion docs/articles/Context.html

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

18 changes: 9 additions & 9 deletions docs/articles/DataFields.html

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

2 changes: 1 addition & 1 deletion docs/articles/Filtering.html

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

4 changes: 2 additions & 2 deletions docs/articles/GettingStarted.html

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

2 changes: 1 addition & 1 deletion docs/articles/Grouping.html

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

4 changes: 2 additions & 2 deletions docs/articles/HumdrumSyntax.html

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

6 changes: 3 additions & 3 deletions docs/articles/KeysAndChord.html

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

4 changes: 2 additions & 2 deletions docs/articles/PitchAndTonality.html

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

Loading

0 comments on commit 6ccad1b

Please sign in to comment.