module Basement.Show where import qualified Prelude import Basement.Compat.Base import Basement.UTF8.Base (String) -- | Use the Show class to create a String. -- -- Note that this is not efficient, since -- an intermediate [Char] is going to be -- created before turning into a real String. show :: Prelude.Show a => a -> String show :: forall a. Show a => a -> String show = forall l. IsList l => [Item l] -> l fromList forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k). Category cat => cat b c -> cat a b -> cat a c . forall a. Show a => a -> String Prelude.show