Safe Haskell | None |
---|---|
Language | Haskell2010 |
- class PrettyPrint p where
- data HTMLPP = HTMLPP
- outputHTMLA :: ProgUnit Annotation -> String
- outputHTML :: forall p. (Data p, Typeable p, PrintSlave p HTMLPP, PrintSlave (Decl p) HTMLPP, PrintIndSlave (Fortran p) HTMLPP, Indentor (Decl p), Indentor (Fortran p)) => ProgUnit p -> String
- showUse' :: Uses p -> String
- countToColor :: Int -> [Char]
- colors :: [[Char]]
- prettyp :: [Char] -> [Char]
- prettyp' :: [Char] -> Int -> [Bool] -> [Char]
- nearbyClose :: (Num a, Eq a) => [Char] -> a -> Bool
- annotationMark :: Tagged d => t -> d Annotation -> [Char] -> [Char]
- row :: Foldable t => t [Char] -> [Char]
- breakUp :: [Char] -> [Char]
- outputAnn :: Annotation -> Bool -> Int -> [Char] -> [Char]
- type A1 = Bool
- keyword :: [Text]
Documentation
class PrettyPrint p where Source #
prettyPrint :: p -> SourceText Source #
outputHTMLA :: ProgUnit Annotation -> String Source #
Convert source code to a pretty-printed HTML format
outputHTML :: forall p. (Data p, Typeable p, PrintSlave p HTMLPP, PrintSlave (Decl p) HTMLPP, PrintIndSlave (Fortran p) HTMLPP, Indentor (Decl p), Indentor (Fortran p)) => ProgUnit p -> String Source #
countToColor :: Int -> [Char] Source #
annotationMark :: Tagged d => t -> d Annotation -> [Char] -> [Char] Source #