{- (c) The University of Glasgow, 2000-2006 -} {-# LANGUAGE CPP, MagicHash, UnboxedTuples #-} module GHC.Utils.IO.Unsafe ( inlinePerformIO, ) where #include "HsVersions.h" import GHC.Prelude () import GHC.Exts import GHC.IO (IO(..)) -- Just like unsafeDupablePerformIO, but we inline it. {-# INLINE inlinePerformIO #-} inlinePerformIO :: IO a -> a inlinePerformIO :: forall a. IO a -> a inlinePerformIO (IO State# RealWorld -> (# State# RealWorld, a #) m) = case State# RealWorld -> (# State# RealWorld, a #) m State# RealWorld realWorld# of (# State# RealWorld _, a r #) -> a r