{-# LANGUAGE MagicHash, Rank2Types, UnboxedTuples #-}
module Data.HashMap.Unsafe
( runST
) where
import GHC.Base (realWorld#)
import GHC.ST hiding (runST, runSTRep)
runST :: (forall s. ST s a) -> a
runST st = runSTRep (case st of { ST st_rep -> st_rep })
{-# INLINE runST #-}
runSTRep :: (forall s. STRep s a) -> a
runSTRep st_rep = case st_rep realWorld# of
(# _, r #) -> r
{-# INLINE [0] runSTRep #-}