module Data.Dynamic.Reify (
MuRef(..),
module Data.Reify.Graph,
reifyGraph,
) where
import Control.Concurrent.MVar
import Control.Monad
import Data.Unique
import System.Mem.StableName
import Data.IntMap as M
import Data.Dynamic
import Control.Applicative
import Data.Reify.Graph
class MuRef a where
type DeRef a :: * -> *
mapDeRef :: (Applicative f) =>
(forall b . (MuRef b,
Typeable b,
DeRef a ~ DeRef b) => b -> f u)
-> a
-> f (DeRef a u)
reifyGraph :: (MuRef s, Typeable s) => s -> IO (Graph (DeRef s))
reifyGraph m = do rt1 <- newMVar M.empty
rt2 <- newMVar []
root <- findNodes rt1 rt2 m
pairs <- readMVar rt2
return (Graph pairs root)
findNodes :: (MuRef s, Typeable s)
=> MVar (IntMap [(Dynamic,Unique)])
-> MVar [(Unique,DeRef s Unique)]
-> s
-> IO Unique
findNodes rt1 rt2 j | j `seq` True = do
st <- makeStableName j
tab <- takeMVar rt1
case mylookup st tab of
Just var -> do putMVar rt1 tab
return $ var
Nothing ->
do var <- newUnique
putMVar rt1 $ M.insertWith (++) (hashStableName st) [(toDyn st,var)] tab
res <- mapDeRef (findNodes rt1 rt2) j
tab' <- takeMVar rt2
putMVar rt2 $ (var,res) : tab'
return var
mylookup :: (Typeable a) => StableName a -> IntMap [(Dynamic,Unique)] -> Maybe Unique
mylookup h tab =
case M.lookup (hashStableName h) tab of
Just tab2 -> Prelude.lookup (Just h) [ (fromDynamic c,u) | (c,u) <- tab2 ]
Nothing -> Nothing