Safe Haskell | None |
---|---|
Language | Haskell98 |
Documentation
type EdgeLabel = (ProtoBranch, Branch) Source #
type ProtoBranch = Branch Source #
newtype GraphGenT m a Source #
Instances
MonadTrans GraphGenT Source # | |
Monad m => MonadState Graph (GraphGenT m) Source # | |
MonadError e m => MonadError e (GraphGenT m) Source # | |
Defined in GraphViz throwError :: e -> GraphGenT m a # catchError :: GraphGenT m a -> (e -> GraphGenT m a) -> GraphGenT m a # | |
Monad m => Monad (GraphGenT m) Source # | |
Functor m => Functor (GraphGenT m) Source # | |
MonadFix m => MonadFix (GraphGenT m) Source # | |
Monad m => Applicative (GraphGenT m) Source # | |
Defined in GraphViz | |
MonadPlus m => Alternative (GraphGenT m) Source # | |
MonadPlus m => MonadPlus (GraphGenT m) Source # | |
Monad m => MonadGraphGen (GraphGenT m) Source # | |
Defined in GraphViz createConnections :: Branch -> [Branch] -> [Branch] -> GraphGenT m () # markSolution :: Unifier -> GraphGenT m () # markCutBranches :: Stack -> GraphGenT m () # |
runGraphGenT :: GraphGenT m a -> m (a, Graph) Source #
formatNode :: NodeLabel -> [Attribute] Source #
formatEdge :: EdgeLabel -> [Attribute] Source #
simplify :: [Substitution] -> Unifier Source #
modifyLabel :: MonadState (Gr a b) m => Int -> (a -> a) -> m () Source #
filterOriginal :: [(VariableName, b)] -> [(VariableName, b)] Source #
hashString :: [Char] -> Integer Source #