{-# LANGUAGE ExistentialQuantification #-}

module Data.Graph.Immutable where

import Data.Graph.Immutable.Tagged

data SomeGraph e v = forall g. SomeGraph { getSomeGraph :: Graph g e v }