haskell-igraph-0.7.0: Haskell interface of the igraph library.

Safe HaskellNone
LanguageHaskell2010

IGraph.Types

Documentation

data EdgeType Source #

Constructors

D 
U 
Instances
Eq EdgeType Source # 
Instance details
Generic EdgeType Source # 
Instance details

Associated Types

type Rep EdgeType :: * -> * #

Methods

from :: EdgeType -> Rep EdgeType x #

to :: Rep EdgeType x -> EdgeType #

Serialize EdgeType Source # 
Instance details
SEq EdgeType Source # 
Instance details

Methods

(%==) :: Sing a -> Sing b -> Sing (a == b) #

(%/=) :: Sing a -> Sing b -> Sing (a /= b) #

PEq EdgeType Source # 
Instance details

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

SDecide EdgeType Source # 
Instance details

Methods

(%~) :: Sing a -> Sing b -> Decision (a :~: b) #

SingKind EdgeType Source # 
Instance details

Associated Types

type Demote EdgeType = (r :: *) #

SingI D Source # 
Instance details

Methods

sing :: Sing D #

SingI U Source # 
Instance details

Methods

sing :: Sing U #

type Rep EdgeType Source # 
Instance details
type Rep EdgeType = D1 (MetaData "EdgeType" "IGraph.Types" "haskell-igraph-0.7.0-28bZ7LxlsbjHs79mtNetQJ" False) (C1 (MetaCons "D" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "U" PrefixI False) (U1 :: * -> *))
data Sing (z :: EdgeType) Source # 
Instance details
data Sing (z :: EdgeType) where
type Demote EdgeType Source # 
Instance details
type (x :: EdgeType) /= (y :: EdgeType) Source # 
Instance details
type (x :: EdgeType) /= (y :: EdgeType) = Not (x == y)
type (a :: EdgeType) == (b :: EdgeType) Source # 
Instance details

type DSym0 = D Source #

type USym0 = U Source #

type Node = Int Source #

type LNode a = (Node, a) Source #

type Edge = (Node, Node) Source #

type LEdge a = (Edge, a) Source #