module ShowIO where

import Data.Typeable

instance Typeable a => Show (IO a) where
    show e = '<' : (show . typeOf) e ++ ">"