module Documentation.Haddock
(
Interface (..)
, InstalledInterface (..)
, toInstalledIface
, createInterfaces
, processModules
, ExportItem (..)
, DocForDecl
, FnArgsDoc
, LinkEnv
, DocName (..)
, DocInstance
, InstHead
, Doc
, MDoc
, DocH (..)
, Example (..)
, Hyperlink (..)
, DocMarkup
, DocMarkupH (..)
, Documentation (..)
, ArgMap
, WarningMap
, DocMap
, HaddockModInfo (..)
, markup
, InterfaceFile (..)
, readInterfaceFile
, freshNameCache
, Flag (..)
, DocOption (..)
, HaddockException (..)
, haddock
, haddockWithGhc
, getGhcDirs
, withGhc
) where
import Documentation.Haddock.Markup (markup)
import Haddock
import Haddock.Interface
import Haddock.InterfaceFile
import Haddock.Options
import Haddock.Types
createInterfaces
:: [Flag]
-> [String]
-> IO [Interface]
createInterfaces :: [Flag] -> [String] -> IO [Interface]
createInterfaces [Flag]
flags [String]
modules = do
(_, ifaces, _) <- [Flag]
-> Ghc
([(DocPaths, Visibility, String, InterfaceFile)], [Interface],
LinkEnv)
-> IO
([(DocPaths, Visibility, String, InterfaceFile)], [Interface],
LinkEnv)
forall a. [Flag] -> Ghc a -> IO a
withGhc [Flag]
flags ([Flag]
-> [String]
-> Ghc
([(DocPaths, Visibility, String, InterfaceFile)], [Interface],
LinkEnv)
readPackagesAndProcessModules [Flag]
flags [String]
modules)
return ifaces