th-typegraph-0.31: Graph of the subtype relation

Safe HaskellNone
LanguageHaskell2010

Language.Haskell.TH.TypeGraph.Prelude

Synopsis

Documentation

pprint' :: Ppr a => a -> [Char] Source

Pretty print a Ppr value on a single line with each block of white space (newlines, tabs, etc.) converted to a single space.

unlifted :: (IsUnlifted t, Quasi m) => t -> m Bool Source

unReify :: Data a => a -> a Source

adjacent' :: forall node key. (Graph, Vertex -> (node, key, [key]), key -> Maybe Vertex) -> key -> [key] Source

Return a key's list of adjacent keys

reachable' :: forall node key. (Graph, Vertex -> (node, key, [key]), key -> Maybe Vertex) -> key -> [key] Source

Return a key's list of reachable keys

newtype L a Source

Constructors

L a 

Instances

Ppr a => Ppr (L [a]) Source 

friendlyNames :: Data a => a -> a Source

Make a template haskell value more human reader friendly. The result almost certainly won't be compilable. That's ok, though, because the input is usually uncompilable - it imports hidden modules, uses infix operators in invalid positions, puts module qualifiers in places where they are not allowed, and maybe other things.