diff options
| author | TEC <tec@tecosaur.com> | 2020-11-18 02:06:30 +0800 | 
|---|---|---|
| committer | Albert Krewinkel <albert+github@zeitkraut.de> | 2020-11-18 14:48:56 +0100 | 
| commit | 0306eec5fa3591fc864d9e2e3c0b84a1229509e6 (patch) | |
| tree | cb2e769efb85b4a51be1b572c478117a7d1529ac /src/Text | |
| parent | 224a501b29248a56bfb05f8092ea6db81b838f59 (diff) | |
| download | pandoc-0306eec5fa3591fc864d9e2e3c0b84a1229509e6.tar.gz | |
Replace org #+KEYWORDS with #+keywords
As of ~2 years ago, lower case keywords became the standard (though they
are handled case insensitive, as always):
https://code.orgmode.org/bzg/org-mode/commit/13424336a6f30c50952d291e7a82906c1210daf0
Upper case keywords are exclusive to the manual:
- https://orgmode.org/list/871s50zn6p.fsf@nicolasgoaziou.fr/
- https://orgmode.org/list/87tuuw3n15.fsf@nicolasgoaziou.fr/
Diffstat (limited to 'src/Text')
| -rw-r--r-- | src/Text/Pandoc/Readers/Org/Blocks.hs | 22 | ||||
| -rw-r--r-- | src/Text/Pandoc/Writers/Org.hs | 32 | 
2 files changed, 27 insertions, 27 deletions
| diff --git a/src/Text/Pandoc/Readers/Org/Blocks.hs b/src/Text/Pandoc/Readers/Org/Blocks.hs index cd91e9ecc..f2e8b1ab6 100644 --- a/src/Text/Pandoc/Readers/Org/Blocks.hs +++ b/src/Text/Pandoc/Readers/Org/Blocks.hs @@ -111,23 +111,23 @@ attrFromBlockAttributes BlockAttributes{..} =  stringyMetaAttribute :: Monad m => OrgParser m (Text, Text)  stringyMetaAttribute = try $ do    metaLineStart -  attrName <- T.toUpper <$> many1TillChar nonspaceChar (char ':') +  attrName <- T.toLower <$> many1TillChar nonspaceChar (char ':')    skipSpaces    attrValue <- anyLine <|> ("" <$ newline)    return (attrName, attrValue)  -- | Parse a set of block attributes. Block attributes are given through --- lines like @#+CAPTION: block caption@ or @#+ATTR_HTML: :width 20@. +-- lines like @#+caption: block caption@ or @#+attr_html: :width 20@.  -- Parsing will fail if any line contains an attribute different from  -- those attributes known to work on blocks.  blockAttributes :: PandocMonad m => OrgParser m BlockAttributes  blockAttributes = try $ do    kv <- many stringyMetaAttribute    guard $ all (isBlockAttr . fst) kv -  let caption = foldl' (appendValues "CAPTION") Nothing kv -  let kvAttrs = foldl' (appendValues "ATTR_HTML") Nothing kv -  let name    = lookup "NAME" kv -  let label   = lookup "LABEL" kv +  let caption = foldl' (appendValues "caption") Nothing kv +  let kvAttrs = foldl' (appendValues "attr_html") Nothing kv +  let name    = lookup "name" kv +  let label   = lookup "label" kv    caption' <- traverse (parseFromString inlines . (<> "\n")) caption    kvAttrs' <- parseFromString keyValues . (<> "\n") $ fromMaybe mempty kvAttrs    return BlockAttributes @@ -139,9 +139,9 @@ blockAttributes = try $ do   where     isBlockAttr :: Text -> Bool     isBlockAttr = flip elem -                 [ "NAME", "LABEL", "CAPTION" -                 , "ATTR_HTML", "ATTR_LATEX" -                 , "RESULTS" +                 [ "name", "label", "caption" +                 , "attr_html", "attr_latex" +                 , "results"                   ]     appendValues :: Text -> Maybe Text -> (Text, Text) -> Maybe Text @@ -170,10 +170,10 @@ keyValues = try $  -- --- Org Blocks (#+BEGIN_... / #+END_...) +-- Org Blocks (#+begin_... / #+end_...)  -- --- | Read an org-mode block delimited by #+BEGIN_TYPE and #+END_TYPE. +-- | Read an org-mode block delimited by #+begin_type and #+end_type.  orgBlock :: PandocMonad m => OrgParser m (F Blocks)  orgBlock = try $ do    blockAttrs <- blockAttributes diff --git a/src/Text/Pandoc/Writers/Org.hs b/src/Text/Pandoc/Writers/Org.hs index 41d48b44b..2af93017d 100644 --- a/src/Text/Pandoc/Writers/Org.hs +++ b/src/Text/Pandoc/Writers/Org.hs @@ -106,7 +106,7 @@ blockToOrg (Para [Image attr txt (src,tgt)])    | Just tit <- T.stripPrefix "fig:" tgt = do        capt <- if null txt                then return empty -              else ("#+CAPTION: " <>) `fmap` inlineListToOrg txt +              else ("#+caption: " <>) `fmap` inlineListToOrg txt        img <- inlineToOrg (Image attr txt (src,tit))        return $ capt $$ img $$ blankline  blockToOrg (Para inlines) = do @@ -121,11 +121,11 @@ blockToOrg (LineBlock lns) = do    let joinWithBlankLines = mconcat . intersperse blankline    let prettifyStanza ls  = joinWithLinefeeds <$> mapM inlineListToOrg ls    contents <- joinWithBlankLines <$> mapM prettifyStanza (splitStanza lns) -  return $ blankline $$ "#+BEGIN_VERSE" $$ -           nest 2 contents $$ "#+END_VERSE" <> blankline +  return $ blankline $$ "#+begin_verse" $$ +           nest 2 contents $$ "#+end_verse" <> blankline  blockToOrg (RawBlock "html" str) = -  return $ blankline $$ "#+BEGIN_HTML" $$ -           nest 2 (literal str) $$ "#+END_HTML" $$ blankline +  return $ blankline $$ "#+begin_html" $$ +           nest 2 (literal str) $$ "#+end_html" $$ blankline  blockToOrg b@(RawBlock f str)    | isRawFormat f = return $ literal str    | otherwise     = do @@ -148,19 +148,19 @@ blockToOrg (CodeBlock (_,classes,kvs) str) = do                        else ""    let at = map pandocLangToOrg classes `intersect` orgLangIdentifiers    let (beg, end) = case at of -                      []    -> ("#+BEGIN_EXAMPLE" <> numberlines, "#+END_EXAMPLE") -                      (x:_) -> ("#+BEGIN_SRC " <> x <> numberlines, "#+END_SRC") +                      []    -> ("#+begin_example" <> numberlines, "#+end_example") +                      (x:_) -> ("#+begin_src " <> x <> numberlines, "#+end_src")    return $ literal beg $$ nest 2 (literal str) $$ text end $$ blankline  blockToOrg (BlockQuote blocks) = do    contents <- blockListToOrg blocks -  return $ blankline $$ "#+BEGIN_QUOTE" $$ -           nest 2 contents $$ "#+END_QUOTE" $$ blankline +  return $ blankline $$ "#+begin_quote" $$ +           nest 2 contents $$ "#+end_quote" $$ blankline  blockToOrg (Table _ blkCapt specs thead tbody tfoot) =  do    let (caption', _, _, headers, rows) = toLegacyTable blkCapt specs thead tbody tfoot    caption'' <- inlineListToOrg caption'    let caption = if null caption'                     then empty -                   else "#+CAPTION: " <> caption'' +                   else "#+caption: " <> caption''    headers' <- mapM blockListToOrg headers    rawRows <- mapM (mapM blockListToOrg) rows    let numChars = maximum . map offset @@ -292,12 +292,12 @@ divToOrg attr bs = do    case divBlockType attr of      GreaterBlock blockName attr' ->        -- Write as greater block. The ID, if present, is added via -      -- the #+NAME keyword; other classes and key-value pairs -      -- are kept as #+ATTR_HTML attributes. +      -- the #+name keyword; other classes and key-value pairs +      -- are kept as #+attr_html attributes.        return $ blankline $$ attrHtml attr' -            $$ "#+BEGIN_" <> literal blockName +            $$ "#+begin_" <> literal blockName              $$ contents -            $$ "#+END_" <> literal blockName $$ blankline +            $$ "#+end_" <> literal blockName $$ blankline      Drawer drawerName (_,_,kvs) -> do        -- Write as drawer. Only key-value pairs are retained.        let keys = vcat $ map (\(k,v) -> @@ -320,8 +320,8 @@ attrHtml :: Attr -> Doc Text  attrHtml (""   , []     , []) = mempty  attrHtml (ident, classes, kvs) =    let -    name = if T.null ident then mempty else "#+NAME: " <> literal ident <> cr -    keyword = "#+ATTR_HTML" +    name = if T.null ident then mempty else "#+name: " <> literal ident <> cr +    keyword = "#+attr_html"      classKv = ("class", T.unwords classes)      kvStrings = map (\(k,v) -> ":" <> k <> " " <> v) (classKv:kvs)    in name <> keyword <> ": " <> literal (T.unwords kvStrings) <> cr | 
