This commit is contained in:
Dimitris Apostolou 2022-02-22 19:05:39 +02:00 committed by GitHub
parent 3bc3e96837
commit 2f521081ad
No known key found for this signature in database
GPG key ID: 4AEE18F83AFDEB23
17 changed files with 28 additions and 28 deletions

View file

@ -4799,7 +4799,7 @@ them and they won't be treated as math delimiters.
For display math, use `$$` delimiters. (In this case, the delimiters
may be separated from the formula by whitespace. However, there can be
no blank lines betwen the opening and closing `$$` delimiters.)
no blank lines between the opening and closing `$$` delimiters.)
TeX math will be printed in all output formats. How it is rendered
depends on the output format:

View file

@ -6886,7 +6886,7 @@ delimiters.
For display math, use \f[V]$$\f[R] delimiters.
(In this case, the delimiters may be separated from the formula by
whitespace.
However, there can be no blank lines betwen the opening and closing
However, there can be no blank lines between the opening and closing
\f[V]$$\f[R] delimiters.)
.PP
TeX math will be printed in all output formats.

View file

@ -89,7 +89,7 @@ instance (Pushable a, Pushable b) => Pushable (KeyValue a b) where
Lua.push v
Lua.rawset (Lua.nth 3)
-- | Convert Pandoc to custom markup usind a classic Lua writer.
-- | Convert Pandoc to custom markup using a classic Lua writer.
runCustom :: LuaError e
=> WriterOptions
-> Pandoc

View file

@ -968,11 +968,11 @@ addList marker = do
lists <- gets stLists
lastExampleId <- gets stExampleId
modify $ \st -> st{ stLists = lists ++ case marker of
-- Use only first occurence of Example for list declaration to avoid overhead
-- Use only first occurrence of Example for list declaration to avoid overhead
NumberMarker Example _ _ | isJust lastExampleId -> []
_ -> [marker]
, stExampleId = case marker of
-- Reuse the same identifier for all other occurences of Example
-- Reuse the same identifier for all other occurrences of Example
NumberMarker Example _ _ -> lastExampleId <|> Just (baseListId + length lists)
_ -> lastExampleId
}

View file

@ -39,7 +39,7 @@ newtype JATSState = JATSState
-- | Environment containing all information relevant for rendering.
data JATSEnv m = JATSEnv
{ jatsTagSet :: JATSTagSet -- ^ The tag set that's being ouput
{ jatsTagSet :: JATSTagSet -- ^ The tag set that's being output
, jatsBlockWriter :: (Block -> Bool)
-> WriterOptions -> [Block] -> JATS m (Doc Text)

View file

@ -617,7 +617,7 @@ defListItemToLaTeX (term, defs) = do
_ ->
"\\item" <> brackets term'' $$ def'
-- | Craft the section header, inserting the secton reference, if supplied.
-- | Craft the section header, inserting the section reference, if supplied.
sectionHeader :: PandocMonad m
=> [Text] -- classes
-> Text

View file

@ -99,23 +99,23 @@ filterElement p e = listToMaybe (filterElements p e)
filterElementName :: (QName -> Bool) -> Element -> Maybe Element
filterElementName p e = listToMaybe (filterElementsName p e)
-- | Find all non-nested occurances of an element.
-- | Find all non-nested occurrences of an element.
-- (i.e., once we have found an element, we do not search
-- for more occurances among the element's children).
-- for more occurrences among the element's children).
findElements :: QName -> Element -> [Element]
findElements qn e = filterElementsName (qn==) e
-- | Find all non-nested occurrences of an element wrt. given predicate.
-- (i.e., once we have found an element, we do not search
-- for more occurances among the element's children).
-- for more occurrences among the element's children).
filterElements :: (Element -> Bool) -> Element -> [Element]
filterElements p e
| p e = [e]
| otherwise = concatMap (filterElements p) $ onlyElems $ elContent e
-- | Find all non-nested occurences of an element wrt a predicate over element names.
-- | Find all non-nested occurrences of an element wrt a predicate over element names.
-- (i.e., once we have found an element, we do not search
-- for more occurances among the element's children).
-- for more occurrences among the element's children).
filterElementsName :: (QName -> Bool) -> Element -> [Element]
filterElementsName p e = filterElements (p.elName) e

View file

@ -225,12 +225,12 @@ tests = [ testGroup "inlines"
, "Ordered list" =:
T.unlines [ " - The same list but ordered"
, " - Another item"
, " - Just use indention for deeper levels"
, " - Just use indentation for deeper levels"
, " - That's it"
] =?>
orderedList [ plain "The same list but ordered"
, plain "Another item" <>
orderedList [ plain "Just use indention for deeper levels" ]
orderedList [ plain "Just use indentation for deeper levels" ]
, plain "That's it"
]
, "Multiline list items" =: -- https://www.dokuwiki.org/faq:lists

View file

@ -120,7 +120,7 @@ tests = [ testGroup "base tag"
=?>
codeBlockWith ("a", ["python"], []) "print('hi')"
, test html "attributes in pre take precendence" $
, test html "attributes in pre take precedence" $
"<pre id=\"c\"><code id=\"d\">\nprint('hi mom!')\n</code></pre>"
=?>
codeBlockWith ("c", [], []) "print('hi mom!')"

View file

@ -371,13 +371,13 @@ tests = [ testGroup "inline code"
, test markdownMMD "normal superscript"
("x^3^"
=?> para ("x" <> superscript "3"))
, test markdownMMD "short subscript delimeted by space"
, test markdownMMD "short subscript delimited by space"
("O~2 is dangerous"
=?> para ("O" <> subscript "2" <> space <> "is dangerous"))
, test markdownMMD "short subscript delimeted by newline"
, test markdownMMD "short subscript delimited by newline"
("O~2\n"
=?> para ("O" <> subscript "2"))
, test markdownMMD "short subscript delimeted by EOF"
, test markdownMMD "short subscript delimited by EOF"
("O~2"
=?> para ("O" <> subscript "2"))
, test markdownMMD "short subscript delimited by punctuation"
@ -389,13 +389,13 @@ tests = [ testGroup "inline code"
, test markdownMMD "no nesting in short subscripts"
("y~*2*"
=?> para ("y~" <> emph "2"))
, test markdownMMD "short superscript delimeted by space"
, test markdownMMD "short superscript delimited by space"
("x^2 = y"
=?> para ("x" <> superscript "2" <> space <> "= y"))
, test markdownMMD "short superscript delimeted by newline"
, test markdownMMD "short superscript delimited by newline"
("x^2\n"
=?> para ("x" <> superscript "2"))
, test markdownMMD "short superscript delimeted by ExF"
, test markdownMMD "short superscript delimited by ExF"
("x^2"
=?> para ("x" <> superscript "2"))
, test markdownMMD "short superscript delimited by punctuation"

View file

@ -2,7 +2,7 @@
% pandoc -f biblatex -t markdown -s
@comment{
Nested crossreferences (see biber manual v 1.7)
Nested cross-references (see biber manual v 1.7)
}

View file

@ -9,7 +9,7 @@ When theres a biblatex “title” and a “subtitle” field, CSL “title-s
CSL “container-title-short” could also be set
- from biblatex “shortjournal”
- for inbook, incollection etc. from the “shorttitle” field of the crossreferenced book, collection etc. entry (see item5, item6)
- for inbook, incollection etc. from the “shorttitle” field of the cross-referenced book, collection etc. entry (see item5, item6)
... but it might not really be worth it, “container-title-short” not being used once in my sample of 70+ CSL styles.
}

View file

@ -104,7 +104,7 @@
</names>
</if>
</choose>
<!--This includes page numers after the container author, e.g. for Introductions -->
<!--This includes page numbers after the container author, e.g. for Introductions -->
<choose>
<if variable="container-author author" match="all">
<group delimiter=". ">

View file

@ -102,7 +102,7 @@
</names>
</if>
</choose>
<!--This includes page numers after the container author, e.g. for Introductions -->
<!--This includes page numbers after the container author, e.g. for Introductions -->
<choose>
<if variable="container-author author" match="all">
<group delimiter=". ">

View file

@ -109,7 +109,7 @@
</names>
</if>
</choose>
<!--This includes page numers after the container author, e.g. for Introductions -->
<!--This includes page numbers after the container author, e.g. for Introductions -->
<choose>
<if variable="container-author author" match="all">
<group delimiter=". ">

View file

@ -37,7 +37,7 @@
* correcting errors
known bugs, help appreciated
* Abbreviations (Mitarb.) & (Hrsg. der Reihe) are missing (contributor, seriesEditor labels)
* "contributor" is not valid as a name variable , nevertheless it works but doesnt validate!
* "contributor" is not valid as a name variable , nevertheless it works but doesn't validate!
* author etc. first names should not be abbreviated
* reviewed author seems to be not available as variable (newspaper article)
* thesis type does notoffer a PLACE or FACULTY as variable!

View file

@ -1,4 +1,4 @@
A table within a table should be convertet into a table within table
A table within a table should be converted into a table within table
```
% pandoc -f html -t asciidoc