Skip to content
Snippets Groups Projects
Commit 74d1173f authored by alexbiehl's avatar alexbiehl
Browse files

Prepare haddock-library-1.4.5 release

parent 619fd646
No related branches found
Tags ghc-8.5-start
No related merge requests found
......@@ -15,7 +15,8 @@ bug-reports: https://github.com/haskell/haddock/issues
category: Documentation
build-type: Simple
cabal-version: >= 2.0
extra-source-files:
CHANGES.md
library
default-language: Haskell2010
......
module Documentation.Haddock.Markup where
-- | @since 1.4.5
module Documentation.Haddock.Markup (
markup
, idMarkup
) where
import Documentation.Haddock.Types
......
......@@ -81,6 +81,14 @@ data DocH mod id
| DocHeader (Header (DocH mod id))
deriving (Eq, Show, Functor, Foldable, Traversable)
-- | 'DocMarkupH' is a set of instructions for marking up documentation.
-- In fact, it's really just a mapping from 'Doc' to some other
-- type [a], where [a] is usually the type of the output (HTML, say).
-- Use 'Documentation.Haddock.Markup.markup' to apply a 'DocMarkupH' to
-- a 'DocH'.
--
-- @since 1.4.5
--
data DocMarkupH mod id a = Markup
{ markupEmpty :: a
, markupString :: String -> a
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment