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 :: a -> String show = [Char] -> String forall l. IsList l => [Item l] -> l fromList ([Char] -> String) -> (a -> [Char]) -> a -> String forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k). Category cat => cat b c -> cat a b -> cat a c . a -> [Char] forall a. Show a => a -> [Char] Prelude.show