diff options
| author | John MacFarlane <jgm@berkeley.edu> | 2016-05-01 22:43:38 -0700 | 
|---|---|---|
| committer | John MacFarlane <jgm@berkeley.edu> | 2016-05-01 22:43:38 -0700 | 
| commit | ee4e8632253c72e15ea38b0f60a8ef54aa9c5d09 (patch) | |
| tree | 65952bba314f18cfe72702fc175f9474ffecf012 /src | |
| parent | 99eac312feb258ac4129c923e5b4fde57da9fbc3 (diff) | |
| parent | fd36e6b64a516ffd281af0667afc6d9c00a70d64 (diff) | |
| download | pandoc-ee4e8632253c72e15ea38b0f60a8ef54aa9c5d09.tar.gz | |
Merge pull request #2890 from bcdevices/docbook5-writer
Docbook5 write support
Diffstat (limited to 'src')
| -rw-r--r-- | src/Text/Pandoc.hs | 2 | ||||
| -rw-r--r-- | src/Text/Pandoc/Options.hs | 2 | ||||
| -rw-r--r-- | src/Text/Pandoc/Writers/Docbook.hs | 21 | 
3 files changed, 19 insertions, 6 deletions
| diff --git a/src/Text/Pandoc.hs b/src/Text/Pandoc.hs index b67a53f5b..0330c46e2 100644 --- a/src/Text/Pandoc.hs +++ b/src/Text/Pandoc.hs @@ -291,6 +291,8 @@ writers = [       writeHtmlString o{ writerSlideVariant = RevealJsSlides                        , writerHtml5 = True })    ,("docbook"      , PureStringWriter writeDocbook) +  ,("docbook5"     , PureStringWriter $ \o -> +     writeDocbook o{ writerDocbook5 = True })    ,("opml"         , PureStringWriter writeOPML)    ,("opendocument" , PureStringWriter writeOpenDocument)    ,("latex"        , PureStringWriter writeLaTeX) diff --git a/src/Text/Pandoc/Options.hs b/src/Text/Pandoc/Options.hs index 171210962..701cd8bd1 100644 --- a/src/Text/Pandoc/Options.hs +++ b/src/Text/Pandoc/Options.hs @@ -357,6 +357,7 @@ data WriterOptions = WriterOptions    , writerSourceURL        :: Maybe String  -- ^ Absolute URL + directory of 1st source file    , writerUserDataDir      :: Maybe FilePath -- ^ Path of user data directory    , writerCiteMethod       :: CiteMethod -- ^ How to print cites +  , writerDocbook5         :: Bool       -- ^ Produce DocBook5    , writerHtml5            :: Bool       -- ^ Produce HTML5    , writerHtmlQTags        :: Bool       -- ^ Use @<q>@ tags for quotes in HTML    , writerBeamer           :: Bool       -- ^ Produce beamer LaTeX slide show @@ -403,6 +404,7 @@ instance Default WriterOptions where                        , writerSourceURL        = Nothing                        , writerUserDataDir      = Nothing                        , writerCiteMethod       = Citeproc +                      , writerDocbook5         = False                        , writerHtml5            = False                        , writerHtmlQTags        = False                        , writerBeamer           = False diff --git a/src/Text/Pandoc/Writers/Docbook.hs b/src/Text/Pandoc/Writers/Docbook.hs index 2aaebf99f..9acfe289a 100644 --- a/src/Text/Pandoc/Writers/Docbook.hs +++ b/src/Text/Pandoc/Writers/Docbook.hs @@ -112,10 +112,15 @@ elementToDocbook opts lvl (Sec _ _num (id',_,_) title elements) =                      else elements        tag = case lvl of                   n | n == 0           -> "chapter" -                   | n >= 1 && n <= 5 -> "sect" ++ show n +                   | n >= 1 && n <= 5 -> if writerDocbook5 opts +                                              then "section" +                                              else "sect" ++ show n                     | otherwise        -> "simplesect" -  in  inTags True tag [("id", writerIdentifierPrefix opts ++ id') | -                       not (null id')] $ +      idAttr = [("id", writerIdentifierPrefix opts ++ id') | not (null id')] +      nsAttr = if writerDocbook5 opts && lvl == 0 then [("xmlns", "http://docbook.org/ns/docbook")] +                                      else [] +      attribs = nsAttr ++ idAttr +  in  inTags True tag attribs $        inTagsSimple "title" (inlinesToDocbook opts title) $$        vcat (map (elementToDocbook opts (lvl + 1)) elements') @@ -227,9 +232,11 @@ blockToDocbook opts (OrderedList (start, numstyle, _) (first:rest)) =  blockToDocbook opts (DefinitionList lst) =    let attribs = [("spacing", "compact") | isTightList $ concatMap snd lst]    in  inTags True "variablelist" attribs $ deflistItemsToDocbook opts lst -blockToDocbook _ (RawBlock f str) +blockToDocbook opts (RawBlock f str)    | f == "docbook" = text str -- raw XML block -  | f == "html"    = text str -- allow html for backwards compatibility +  | f == "html"    = if writerDocbook5 opts +                        then empty -- No html in Docbook5 +                        else text str -- allow html for backwards compatibility    | otherwise      = empty  blockToDocbook _ HorizontalRule = empty -- not semantic  blockToDocbook opts (Table caption aligns widths headers rows) = @@ -344,7 +351,9 @@ inlineToDocbook opts (Link attr txt (src, _))    | otherwise =        (if isPrefixOf "#" src              then inTags False "link" $ ("linkend", drop 1 src) : idAndRole attr -            else inTags False "ulink" $ ("url", src) : idAndRole attr ) $ +            else if writerDocbook5 opts +                    then inTags False "link" $ ("xlink:href", src) : idAndRole attr +                    else inTags False "ulink" $ ("url", src) : idAndRole attr ) $          inlinesToDocbook opts txt  inlineToDocbook opts (Image attr _ (src, tit)) =    let titleDoc = if null tit | 
