module Data.Graph.Inductive.Query.MaxFlow(
getRevEdges, augmentGraph, updAdjList, updateFlow, mfmg, mf, maxFlowgraph,
maxFlow
) where
import Data.List
import Data.Graph.Inductive.Basic
import Data.Graph.Inductive.Graph
import Data.Graph.Inductive.Query.BFS
getRevEdges :: (Num b) => [Edge] -> [LEdge b]
getRevEdges :: forall b. Num b => [Edge] -> [LEdge b]
getRevEdges [] = []
getRevEdges ((Int
u,Int
v):[Edge]
es) | (Int
v,Int
u) Edge -> [Edge] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`notElem` [Edge]
es = (Int
v,Int
u,b
0)LEdge b -> [LEdge b] -> [LEdge b]
forall a. a -> [a] -> [a]
:[Edge] -> [LEdge b]
forall b. Num b => [Edge] -> [LEdge b]
getRevEdges [Edge]
es
| Bool
otherwise = [Edge] -> [LEdge b]
forall b. Num b => [Edge] -> [LEdge b]
getRevEdges (Edge -> [Edge] -> [Edge]
forall a. Eq a => a -> [a] -> [a]
delete (Int
v,Int
u) [Edge]
es)
augmentGraph :: (DynGraph gr, Num b) => gr a b -> gr a (b,b,b)
augmentGraph :: forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b) =>
gr a b -> gr a (b, b, b)
augmentGraph gr a b
g = (b -> (b, b, b)) -> gr a b -> gr a (b, b, b)
forall (gr :: * -> * -> *) b c a.
DynGraph gr =>
(b -> c) -> gr a b -> gr a c
emap (\b
i->(b
i,b
0,b
i)) ([LEdge b] -> gr a b -> gr a b
forall (gr :: * -> * -> *) b a.
DynGraph gr =>
[LEdge b] -> gr a b -> gr a b
insEdges ([Edge] -> [LEdge b]
forall b. Num b => [Edge] -> [LEdge b]
getRevEdges (gr a b -> [Edge]
forall (gr :: * -> * -> *) a b. Graph gr => gr a b -> [Edge]
edges gr a b
g)) gr a b
g)
updAdjList::(Num b) => Adj (b,b,b) -> Node -> b -> Bool -> Adj (b,b,b)
updAdjList :: forall b.
Num b =>
Adj (b, b, b) -> Int -> b -> Bool -> Adj (b, b, b)
updAdjList Adj (b, b, b)
s Int
v b
cf Bool
fwd =
case (((b, b, b), Int) -> Bool)
-> Adj (b, b, b) -> (Adj (b, b, b), Adj (b, b, b))
forall a. (a -> Bool) -> [a] -> ([a], [a])
break ((Int
vInt -> Int -> Bool
forall a. Eq a => a -> a -> Bool
==) (Int -> Bool)
-> (((b, b, b), Int) -> Int) -> ((b, b, b), Int) -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ((b, b, b), Int) -> Int
forall a b. (a, b) -> b
snd) Adj (b, b, b)
s of
(Adj (b, b, b)
rs, ((b
x,b
y,b
z),Int
w):Adj (b, b, b)
rs') -> Adj (b, b, b)
rs Adj (b, b, b) -> Adj (b, b, b) -> Adj (b, b, b)
forall a. [a] -> [a] -> [a]
++ ((b
x,b
yb -> b -> b
forall a. Num a => a -> a -> a
+b
cf',b
zb -> b -> b
forall a. Num a => a -> a -> a
-b
cf'),Int
w) ((b, b, b), Int) -> Adj (b, b, b) -> Adj (b, b, b)
forall a. a -> [a] -> [a]
: Adj (b, b, b)
rs'
(Adj (b, b, b), Adj (b, b, b))
_ -> [Char] -> Adj (b, b, b)
forall a. HasCallStack => [Char] -> a
error [Char]
"updAdjList: invalid node"
where
cf' :: b
cf' = if Bool
fwd
then b
cf
else b -> b
forall a. Num a => a -> a
negate b
cf
updateFlow :: (DynGraph gr, Num b) => Path -> b -> gr a (b,b,b) -> gr a (b,b,b)
updateFlow :: forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b) =>
Path -> b -> gr a (b, b, b) -> gr a (b, b, b)
updateFlow [] b
_ gr a (b, b, b)
g = gr a (b, b, b)
g
updateFlow [Int
_] b
_ gr a (b, b, b)
g = gr a (b, b, b)
g
updateFlow (Int
u:Int
v:Path
vs) b
cf gr a (b, b, b)
g = case Int -> gr a (b, b, b) -> Decomp gr a (b, b, b)
forall a b. Int -> gr a b -> Decomp gr a b
forall (gr :: * -> * -> *) a b.
Graph gr =>
Int -> gr a b -> Decomp gr a b
match Int
u gr a (b, b, b)
g of
(Maybe (Context a (b, b, b))
Nothing,gr a (b, b, b)
g') -> gr a (b, b, b)
g'
(Just (Adj (b, b, b)
p,Int
u',a
l,Adj (b, b, b)
s),gr a (b, b, b)
g') -> (Adj (b, b, b)
p',Int
u',a
l,Adj (b, b, b)
s') Context a (b, b, b) -> gr a (b, b, b) -> gr a (b, b, b)
forall a b. Context a b -> gr a b -> gr a b
forall (gr :: * -> * -> *) a b.
DynGraph gr =>
Context a b -> gr a b -> gr a b
& gr a (b, b, b)
g2
where
g2 :: gr a (b, b, b)
g2 = Path -> b -> gr a (b, b, b) -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b) =>
Path -> b -> gr a (b, b, b) -> gr a (b, b, b)
updateFlow (Int
vInt -> Path -> Path
forall a. a -> [a] -> [a]
:Path
vs) b
cf gr a (b, b, b)
g'
s' :: Adj (b, b, b)
s' = Adj (b, b, b) -> Int -> b -> Bool -> Adj (b, b, b)
forall b.
Num b =>
Adj (b, b, b) -> Int -> b -> Bool -> Adj (b, b, b)
updAdjList Adj (b, b, b)
s Int
v b
cf Bool
True
p' :: Adj (b, b, b)
p' = Adj (b, b, b) -> Int -> b -> Bool -> Adj (b, b, b)
forall b.
Num b =>
Adj (b, b, b) -> Int -> b -> Bool -> Adj (b, b, b)
updAdjList Adj (b, b, b)
p Int
v b
cf Bool
False
mfmg :: (DynGraph gr, Num b, Ord b) => gr a (b,b,b) -> Node -> Node -> gr a (b,b,b)
mfmg :: forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a (b, b, b) -> Int -> Int -> gr a (b, b, b)
mfmg gr a (b, b, b)
g Int
s Int
t
| Path -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null Path
augPath = gr a (b, b, b)
g
| Bool
otherwise = gr a (b, b, b) -> Int -> Int -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a (b, b, b) -> Int -> Int -> gr a (b, b, b)
mfmg (Path -> b -> gr a (b, b, b) -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b) =>
Path -> b -> gr a (b, b, b) -> gr a (b, b, b)
updateFlow Path
augPath b
minC gr a (b, b, b)
g) Int
s Int
t
where
minC :: b
minC = [b] -> b
forall a. Ord a => [a] -> a
forall (t :: * -> *) a. (Foldable t, Ord a) => t a -> a
minimum (((Int, (b, b, b)) -> b) -> [(Int, (b, b, b))] -> [b]
forall a b. (a -> b) -> [a] -> [b]
map ((\(b
_,b
_,b
z)->b
z)((b, b, b) -> b)
-> ((Int, (b, b, b)) -> (b, b, b)) -> (Int, (b, b, b)) -> b
forall b c a. (b -> c) -> (a -> b) -> a -> c
.(Int, (b, b, b)) -> (b, b, b)
forall a b. (a, b) -> b
snd)([(Int, (b, b, b))] -> [(Int, (b, b, b))]
forall a. HasCallStack => [a] -> [a]
tail [(Int, (b, b, b))]
augLPath))
augPath :: Path
augPath = ((Int, (b, b, b)) -> Int) -> [(Int, (b, b, b))] -> Path
forall a b. (a -> b) -> [a] -> [b]
map (Int, (b, b, b)) -> Int
forall a b. (a, b) -> a
fst [(Int, (b, b, b))]
augLPath
LP [(Int, (b, b, b))]
augLPath = Int -> Int -> gr a (b, b, b) -> LPath (b, b, b)
forall (gr :: * -> * -> *) a b.
Graph gr =>
Int -> Int -> gr a b -> LPath b
lesp Int
s Int
t gr a (b, b, b)
gf
gf :: gr a (b, b, b)
gf = ((b, b, b) -> Bool) -> gr a (b, b, b) -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
DynGraph gr =>
(b -> Bool) -> gr a b -> gr a b
elfilter (\(b
_,b
_,b
z)->b
zb -> b -> Bool
forall a. Eq a => a -> a -> Bool
/=b
0) gr a (b, b, b)
g
mf :: (DynGraph gr, Num b, Ord b) => gr a b -> Node -> Node -> gr a (b,b,b)
mf :: forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a b -> Int -> Int -> gr a (b, b, b)
mf gr a b
g = gr a (b, b, b) -> Int -> Int -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a (b, b, b) -> Int -> Int -> gr a (b, b, b)
mfmg (gr a b -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b) =>
gr a b -> gr a (b, b, b)
augmentGraph gr a b
g)
maxFlowgraph :: (DynGraph gr, Num b, Ord b) => gr a b -> Node -> Node -> gr a (b,b)
maxFlowgraph :: forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a b -> Int -> Int -> gr a (b, b)
maxFlowgraph gr a b
g Int
s Int
t = ((b, b, b) -> (b, b)) -> gr a (b, b, b) -> gr a (b, b)
forall (gr :: * -> * -> *) b c a.
DynGraph gr =>
(b -> c) -> gr a b -> gr a c
emap (\(b
u,b
v,b
_)->(b
v,b
u))
(gr a (b, b, b) -> gr a (b, b))
-> (gr a (b, b, b) -> gr a (b, b, b))
-> gr a (b, b, b)
-> gr a (b, b)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ((b, b, b) -> Bool) -> gr a (b, b, b) -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
DynGraph gr =>
(b -> Bool) -> gr a b -> gr a b
elfilter (\(b
x,b
_,b
_) -> b
xb -> b -> Bool
forall a. Eq a => a -> a -> Bool
/=b
0 )
(gr a (b, b, b) -> gr a (b, b)) -> gr a (b, b, b) -> gr a (b, b)
forall a b. (a -> b) -> a -> b
$ gr a b -> Int -> Int -> gr a (b, b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a b -> Int -> Int -> gr a (b, b, b)
mf gr a b
g Int
s Int
t
maxFlow :: (DynGraph gr, Num b, Ord b) => gr a b -> Node -> Node -> b
maxFlow :: forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a b -> Int -> Int -> b
maxFlow gr a b
g Int
s Int
t = [b] -> b
forall a. Num a => [a] -> a
forall (t :: * -> *) a. (Foldable t, Num a) => t a -> a
sum ((LEdge (b, b) -> b) -> [LEdge (b, b)] -> [b]
forall a b. (a -> b) -> [a] -> [b]
map ((b, b) -> b
forall a b. (a, b) -> a
fst ((b, b) -> b) -> (LEdge (b, b) -> (b, b)) -> LEdge (b, b) -> b
forall b c a. (b -> c) -> (a -> b) -> a -> c
. LEdge (b, b) -> (b, b)
forall b. LEdge b -> b
edgeLabel) (gr a (b, b) -> Int -> [LEdge (b, b)]
forall (gr :: * -> * -> *) a b.
Graph gr =>
gr a b -> Int -> [LEdge b]
out (gr a b -> Int -> Int -> gr a (b, b)
forall (gr :: * -> * -> *) b a.
(DynGraph gr, Num b, Ord b) =>
gr a b -> Int -> Int -> gr a (b, b)
maxFlowgraph gr a b
g Int
s Int
t) Int
s))