Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data RGraph :: (u -> *) -> Graph u -> * where Source #
REmpty :: RGraph f 'Empty | |
RVertex :: !(f r) -> RGraph f ('Vertex r) | |
ROverlay :: !(RGraph f xs) -> !(RGraph f ys) -> RGraph f ('Overlay xs ys) | |
RConnect :: !(RGraph f xs) -> !(RGraph f ys) -> RGraph f ('Connect xs ys) |
data VertexList :: Graph a -> Exp [a] Source #
Instances
type Eval (VertexList ('Connect x y) :: [a] -> Type) Source # | |
Defined in Data.Conic.Graph type Eval (VertexList ('Connect x y) :: [a] -> Type) = Eval (LiftM2 ((++) :: [a] -> [a] -> [a] -> Type) (VertexList x) (VertexList y)) | |
type Eval (VertexList ('Overlay x y) :: [a] -> Type) Source # | |
Defined in Data.Conic.Graph type Eval (VertexList ('Overlay x y) :: [a] -> Type) = Eval (LiftM2 ((++) :: [a] -> [a] -> [a] -> Type) (VertexList x) (VertexList y)) | |
type Eval (VertexList ('Vertex x) :: [k] -> Type) Source # | |
Defined in Data.Conic.Graph | |
type Eval (VertexList ('Empty :: Graph a) :: [a] -> Type) Source # | |
Defined in Data.Conic.Graph |
vertexList :: RGraph f xs -> Rec f (Eval (VertexList xs)) Source #