module Data.Graph.Inductive.Query.ArtPoint(
ap
) where
import Data.Graph.Inductive.Graph
data DFSTree a = B (a,a,[(a,a)]) [DFSTree a]
deriving (DFSTree a -> DFSTree a -> Bool
forall a. Eq a => DFSTree a -> DFSTree a -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DFSTree a -> DFSTree a -> Bool
$c/= :: forall a. Eq a => DFSTree a -> DFSTree a -> Bool
== :: DFSTree a -> DFSTree a -> Bool
$c== :: forall a. Eq a => DFSTree a -> DFSTree a -> Bool
Eq, Int -> DFSTree a -> ShowS
forall a. Show a => Int -> DFSTree a -> ShowS
forall a. Show a => [DFSTree a] -> ShowS
forall a. Show a => DFSTree a -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DFSTree a] -> ShowS
$cshowList :: forall a. Show a => [DFSTree a] -> ShowS
show :: DFSTree a -> String
$cshow :: forall a. Show a => DFSTree a -> String
showsPrec :: Int -> DFSTree a -> ShowS
$cshowsPrec :: forall a. Show a => Int -> DFSTree a -> ShowS
Show, ReadPrec [DFSTree a]
ReadPrec (DFSTree a)
ReadS [DFSTree a]
forall a. Read a => ReadPrec [DFSTree a]
forall a. Read a => ReadPrec (DFSTree a)
forall a. Read a => Int -> ReadS (DFSTree a)
forall a. Read a => ReadS [DFSTree a]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DFSTree a]
$creadListPrec :: forall a. Read a => ReadPrec [DFSTree a]
readPrec :: ReadPrec (DFSTree a)
$creadPrec :: forall a. Read a => ReadPrec (DFSTree a)
readList :: ReadS [DFSTree a]
$creadList :: forall a. Read a => ReadS [DFSTree a]
readsPrec :: Int -> ReadS (DFSTree a)
$creadsPrec :: forall a. Read a => Int -> ReadS (DFSTree a)
Read)
data LOWTree a = Brc (a,a,a) [LOWTree a]
deriving (LOWTree a -> LOWTree a -> Bool
forall a. Eq a => LOWTree a -> LOWTree a -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: LOWTree a -> LOWTree a -> Bool
$c/= :: forall a. Eq a => LOWTree a -> LOWTree a -> Bool
== :: LOWTree a -> LOWTree a -> Bool
$c== :: forall a. Eq a => LOWTree a -> LOWTree a -> Bool
Eq, Int -> LOWTree a -> ShowS
forall a. Show a => Int -> LOWTree a -> ShowS
forall a. Show a => [LOWTree a] -> ShowS
forall a. Show a => LOWTree a -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [LOWTree a] -> ShowS
$cshowList :: forall a. Show a => [LOWTree a] -> ShowS
show :: LOWTree a -> String
$cshow :: forall a. Show a => LOWTree a -> String
showsPrec :: Int -> LOWTree a -> ShowS
$cshowsPrec :: forall a. Show a => Int -> LOWTree a -> ShowS
Show, ReadPrec [LOWTree a]
ReadPrec (LOWTree a)
ReadS [LOWTree a]
forall a. Read a => ReadPrec [LOWTree a]
forall a. Read a => ReadPrec (LOWTree a)
forall a. Read a => Int -> ReadS (LOWTree a)
forall a. Read a => ReadS [LOWTree a]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [LOWTree a]
$creadListPrec :: forall a. Read a => ReadPrec [LOWTree a]
readPrec :: ReadPrec (LOWTree a)
$creadPrec :: forall a. Read a => ReadPrec (LOWTree a)
readList :: ReadS [LOWTree a]
$creadList :: forall a. Read a => ReadS [LOWTree a]
readsPrec :: Int -> ReadS (LOWTree a)
$creadsPrec :: forall a. Read a => Int -> ReadS (LOWTree a)
Read)
getBackEdges :: Node -> [[(Node,Int)]] -> [(Node,Int)]
getBackEdges :: Int -> [[(Int, Int)]] -> [(Int, Int)]
getBackEdges Int
_ [] = []
getBackEdges Int
v [[(Int, Int)]]
ls = forall a b. (a -> b) -> [a] -> [b]
map forall a. [a] -> a
head (forall a. (a -> Bool) -> [a] -> [a]
filter (forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
elem (Int
v,Int
0)) (forall a. [a] -> [a]
tail [[(Int, Int)]]
ls))
dfsTree :: (Graph gr) => Int -> Node -> [Node] -> [[(Node,Int)]] ->
gr a b -> ([DFSTree Int],gr a b,Int)
dfsTree :: forall (gr :: * -> * -> *) a b.
Graph gr =>
Int
-> Int
-> [Int]
-> [[(Int, Int)]]
-> gr a b
-> ([DFSTree Int], gr a b, Int)
dfsTree Int
n Int
_ [] [[(Int, Int)]]
_ gr a b
g = ([],gr a b
g,Int
n)
dfsTree Int
n Int
_ [Int]
_ [[(Int, Int)]]
_ gr a b
g | forall (gr :: * -> * -> *) a b. Graph gr => gr a b -> Bool
isEmpty gr a b
g = ([],gr a b
g,Int
n)
dfsTree Int
n Int
u (Int
v:[Int]
vs) [[(Int, Int)]]
ls gr a b
g = case forall (gr :: * -> * -> *) a b.
Graph gr =>
Int -> gr a b -> Decomp gr a b
match Int
v gr a b
g of
(MContext a b
Nothing, gr a b
g1) -> forall (gr :: * -> * -> *) a b.
Graph gr =>
Int
-> Int
-> [Int]
-> [[(Int, Int)]]
-> gr a b
-> ([DFSTree Int], gr a b, Int)
dfsTree Int
n Int
u [Int]
vs [[(Int, Int)]]
ls gr a b
g1
(Just Context a b
c , gr a b
g1) -> (forall a. (a, a, [(a, a)]) -> [DFSTree a] -> DFSTree a
B (Int
v,Int
nforall a. Num a => a -> a -> a
+Int
1,[(Int, Int)]
bck) [DFSTree Int]
tsforall a. a -> [a] -> [a]
:[DFSTree Int]
ts', gr a b
g3, Int
k)
where bck :: [(Int, Int)]
bck = Int -> [[(Int, Int)]] -> [(Int, Int)]
getBackEdges Int
v [[(Int, Int)]]
ls
([DFSTree Int]
ts, gr a b
g2,Int
m) = forall (gr :: * -> * -> *) a b.
Graph gr =>
Int
-> Int
-> [Int]
-> [[(Int, Int)]]
-> gr a b
-> ([DFSTree Int], gr a b, Int)
dfsTree (Int
nforall a. Num a => a -> a -> a
+Int
1) Int
v [Int]
sc [[(Int, Int)]]
ls' gr a b
g1
([DFSTree Int]
ts',gr a b
g3,Int
k) = forall (gr :: * -> * -> *) a b.
Graph gr =>
Int
-> Int
-> [Int]
-> [[(Int, Int)]]
-> gr a b
-> ([DFSTree Int], gr a b, Int)
dfsTree Int
m Int
v [Int]
vs [[(Int, Int)]]
ls gr a b
g2
ls' :: [[(Int, Int)]]
ls' = ((Int
v,Int
nforall a. Num a => a -> a -> a
+Int
1)forall a. a -> [a] -> [a]
:[(Int, Int)]
sc')forall a. a -> [a] -> [a]
:[[(Int, Int)]]
ls
sc' :: [(Int, Int)]
sc' = forall a b. (a -> b) -> [a] -> [b]
map (\Int
x->(Int
x,Int
0)) [Int]
sc
sc :: [Int]
sc = forall a b. Context a b -> [Int]
suc' Context a b
c
minbckEdge :: Int -> [(Node,Int)] -> Int
minbckEdge :: Int -> [(Int, Int)] -> Int
minbckEdge Int
n [] = Int
n
minbckEdge Int
n [(Int, Int)]
bs = forall a. Ord a => a -> a -> a
min Int
n (forall (t :: * -> *) a. (Foldable t, Ord a) => t a -> a
minimum (forall a b. (a -> b) -> [a] -> [b]
map forall a b. (a, b) -> b
snd [(Int, Int)]
bs))
getLow :: LOWTree Int -> Int
getLow :: LOWTree Int -> Int
getLow (Brc (Int
_,Int
_,Int
l) [LOWTree Int]
_) = Int
l
lowTree :: DFSTree Int -> LOWTree Int
lowTree :: DFSTree Int -> LOWTree Int
lowTree (B (Int
v,Int
n,[] ) [] ) = forall a. (a, a, a) -> [LOWTree a] -> LOWTree a
Brc (Int
v,Int
n,Int
n) []
lowTree (B (Int
v,Int
n,[(Int, Int)]
bcks) [] ) = forall a. (a, a, a) -> [LOWTree a] -> LOWTree a
Brc (Int
v,Int
n,Int -> [(Int, Int)] -> Int
minbckEdge Int
n [(Int, Int)]
bcks) []
lowTree (B (Int
v,Int
n,[(Int, Int)]
bcks) [DFSTree Int]
trs) = forall a. (a, a, a) -> [LOWTree a] -> LOWTree a
Brc (Int
v,Int
n,Int
lowv) [LOWTree Int]
ts
where lowv :: Int
lowv = forall a. Ord a => a -> a -> a
min (Int -> [(Int, Int)] -> Int
minbckEdge Int
n [(Int, Int)]
bcks) Int
lowChild
lowChild :: Int
lowChild = forall (t :: * -> *) a. (Foldable t, Ord a) => t a -> a
minimum (forall a b. (a -> b) -> [a] -> [b]
map LOWTree Int -> Int
getLow [LOWTree Int]
ts)
ts :: [LOWTree Int]
ts = forall a b. (a -> b) -> [a] -> [b]
map DFSTree Int -> LOWTree Int
lowTree [DFSTree Int]
trs
getLowTree :: (Graph gr) => gr a b -> Node -> LOWTree Int
getLowTree :: forall (gr :: * -> * -> *) a b.
Graph gr =>
gr a b -> Int -> LOWTree Int
getLowTree gr a b
g Int
v = DFSTree Int -> LOWTree Int
lowTree (forall a. [a] -> a
head [DFSTree Int]
dfsf)
where ([DFSTree Int]
dfsf, gr a b
_, Int
_) = forall (gr :: * -> * -> *) a b.
Graph gr =>
Int
-> Int
-> [Int]
-> [[(Int, Int)]]
-> gr a b
-> ([DFSTree Int], gr a b, Int)
dfsTree Int
0 Int
0 [Int
v] [] gr a b
g
isap :: LOWTree Int -> Bool
isap :: LOWTree Int -> Bool
isap (Brc (Int
_,Int
_,Int
_) []) = Bool
False
isap (Brc (Int
_,Int
1,Int
_) [LOWTree Int]
ts) = forall (t :: * -> *) a. Foldable t => t a -> Int
length [LOWTree Int]
ts forall a. Ord a => a -> a -> Bool
> Int
1
isap (Brc (Int
_,Int
n,Int
_) [LOWTree Int]
ts) = Bool -> Bool
not (forall (t :: * -> *) a. Foldable t => t a -> Bool
null [Int]
ch)
where ch :: [Int]
ch = forall a. (a -> Bool) -> [a] -> [a]
filter ( forall a. Ord a => a -> a -> Bool
>=Int
n) (forall a b. (a -> b) -> [a] -> [b]
map LOWTree Int -> Int
getLow [LOWTree Int]
ts)
arp :: LOWTree Int -> [Node]
arp :: LOWTree Int -> [Int]
arp (Brc (Int
v,Int
1,Int
_) [LOWTree Int]
ts) | forall (t :: * -> *) a. Foldable t => t a -> Int
length [LOWTree Int]
ts forall a. Ord a => a -> a -> Bool
> Int
1 = Int
vforall a. a -> [a] -> [a]
:forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap LOWTree Int -> [Int]
arp [LOWTree Int]
ts
| Bool
otherwise = forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap LOWTree Int -> [Int]
arp [LOWTree Int]
ts
arp (Brc (Int
v,Int
n,Int
l) [LOWTree Int]
ts) | LOWTree Int -> Bool
isap (forall a. (a, a, a) -> [LOWTree a] -> LOWTree a
Brc (Int
v,Int
n,Int
l) [LOWTree Int]
ts) = Int
vforall a. a -> [a] -> [a]
:forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap LOWTree Int -> [Int]
arp [LOWTree Int]
ts
| Bool
otherwise = forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap LOWTree Int -> [Int]
arp [LOWTree Int]
ts
artpoints :: (Graph gr) => gr a b -> Node -> [Node]
artpoints :: forall (gr :: * -> * -> *) a b. Graph gr => gr a b -> Int -> [Int]
artpoints gr a b
g Int
v = LOWTree Int -> [Int]
arp (forall (gr :: * -> * -> *) a b.
Graph gr =>
gr a b -> Int -> LOWTree Int
getLowTree gr a b
g Int
v)
ap :: (Graph gr) => gr a b -> [Node]
ap :: forall (gr :: * -> * -> *) a b. Graph gr => gr a b -> [Int]
ap gr a b
g = forall (gr :: * -> * -> *) a b. Graph gr => gr a b -> Int -> [Int]
artpoints gr a b
g Int
v where ((Adj b
_,Int
v,a
_,Adj b
_),gr a b
_) = forall (gr :: * -> * -> *) a b.
Graph gr =>
gr a b -> GDecomp gr a b
matchAny gr a b
g