fgl-5.7.0.3: Martin Erwig's Functional Graph Library

Safe HaskellNone
LanguageHaskell98

Data.Graph.Inductive.PatriciaTree

Description

An efficient implementation of Graph using big-endian patricia tree (i.e. Data.IntMap).

This module provides the following specialised functions to gain more performance, using GHC's RULES pragma:

Documentation

data Gr a b Source #

Instances
Bifunctor Gr Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

bimap :: (a -> b) -> (c -> d) -> Gr a c -> Gr b d #

first :: (a -> b) -> Gr a c -> Gr b c #

second :: (b -> c) -> Gr a b -> Gr a c #

DynGraph Gr Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

(&) :: Context a b -> Gr a b -> Gr a b Source #

Graph Gr Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

empty :: Gr a b Source #

isEmpty :: Gr a b -> Bool Source #

match :: Node -> Gr a b -> Decomp Gr a b Source #

mkGraph :: [LNode a] -> [LEdge b] -> Gr a b Source #

labNodes :: Gr a b -> [LNode a] Source #

matchAny :: Gr a b -> GDecomp Gr a b Source #

noNodes :: Gr a b -> Int Source #

nodeRange :: Gr a b -> (Node, Node) Source #

labEdges :: Gr a b -> [LEdge b] Source #

(Eq a, Ord b) => Eq (Gr a b) Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

(==) :: Gr a b -> Gr a b -> Bool #

(/=) :: Gr a b -> Gr a b -> Bool #

(Read a, Read b) => Read (Gr a b) Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (Gr a b) #

readList :: ReadS [Gr a b] #

readPrec :: ReadPrec (Gr a b) #

readListPrec :: ReadPrec [Gr a b] #

(Show a, Show b) => Show (Gr a b) Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> Gr a b -> ShowS #

show :: Gr a b -> String #

showList :: [Gr a b] -> ShowS #

Generic (Gr a b) Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Associated Types

type Rep (Gr a b) :: Type -> Type #

Methods

from :: Gr a b -> Rep (Gr a b) x #

to :: Rep (Gr a b) x -> Gr a b #

(NFData a, NFData b) => NFData (Gr a b) Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

rnf :: Gr a b -> () #

type Rep (Gr a b) Source # 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

type Rep (Gr a b)

type UGr = Gr () () Source #