ghc-9.6.1: The GHC API
Safe HaskellSafe-Inferred
LanguageHaskell2010

GHC.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:

Code is from Hackage fgl package version 5.7.0.3

Documentation

data Gr a b Source #

Instances

Instances details
Bifunctor Gr Source # 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

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

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

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

DynGraph Gr Source # 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

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

Graph Gr Source # 
Instance details

Defined in GHC.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 #

Functor (Gr a) Source # 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

fmap :: (a0 -> b) -> Gr a a0 -> Gr a b Source #

(<$) :: a0 -> Gr a b -> Gr a a0 Source #

Generic (Gr a b) Source # 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Associated Types

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

Methods

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

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

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

Defined in GHC.Data.Graph.Inductive.PatriciaTree

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

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

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

show :: Gr a b -> String Source #

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

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

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

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

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

type Rep (Gr a b) Source # 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

type Rep (Gr a b)

type UGr = Gr () () Source #