base-4.21.0.0: Core data structures and operations
Copyright(c) The University of Glasgow 1992-2002
Licensesee libraries/base/LICENSE
Maintainerghc-devs@haskell.org
Stabilityinternal
Portabilitynon-portable (GHC Extensions)
Safe HaskellSafe
LanguageHaskell2010

GHC.Show

Description

The Show class, and related operations.

Documentation

class Show a where Source #

Conversion of values to readable String s.

Derived instances of Show have the following properties, which are compatible with derived instances of Read :

  • The result of show is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used.
  • If the constructor is defined to be an infix operator, then showsPrec will produce infix applications of the constructor.
  • the representation will be enclosed in parentheses if the precedence of the top-level constructor in x is less than d (associativity is ignored). Thus, if d is 0 then the result is never surrounded in parentheses; if d is 11 it is always surrounded in parentheses, unless it is an atomic expression.
  • If the constructor is defined using record syntax, then show will produce the record-syntax form, with the fields given in the same order as the original declaration.

For example, given the declarations

infixr 5 :^:
data Tree a = Leaf a | Tree a :^: Tree a

the derived instance of Show is equivalent to

instance (Show a) => Show (Tree a) where
 showsPrec d (Leaf m) = showParen (d > app_prec) $
 showString "Leaf " . showsPrec (app_prec+1) m
 where app_prec = 10
 showsPrec d (u :^: v) = showParen (d > up_prec) $
 showsPrec (up_prec+1) u .
 showString " :^: " .
 showsPrec (up_prec+1) v
 where up_prec = 5

Note that right-associativity of :^: is ignored. For example,

  • show (Leaf 1 :^: Leaf 2 :^: Leaf 3) produces the string "Leaf 1 :^: (Leaf 2 :^: Leaf 3)".

Minimal complete definition

showsPrec | show

Methods

showsPrec Source #

Arguments

:: Int

the operator precedence of the enclosing context (a number from 0 to 11). Function application has precedence 10.

-> a

the value to be converted to a String

-> ShowS

Convert a value to a readable String .

showsPrec should satisfy the law

showsPrec d x r ++ s == showsPrec d x (r ++ s)

Derived instances of Read and Show satisfy the following:

That is, readsPrec parses the string produced by showsPrec , and delivers the value that showsPrec started with.

show :: a -> String Source #

A specialised variant of showsPrec , using precedence context zero, and returning an ordinary String .

showList :: [a] -> ShowS Source #

The method showList is provided to allow the programmer to give a specialised way of showing lists of values. For example, this is used by the predefined Show instance of the Char type, where values of type String should be shown in double quotes, rather than between square brackets.

Instances

Instances details
Show ByteArray Source #

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Show Timeout Source #

Since: base-4.0

Instance details

Defined in System.Timeout

Show Void Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.Show

Show ByteOrder Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.ByteOrder

Show BlockReason Source #

Since: base-4.3.0.0

Show ThreadId Source #

Since: base-4.2.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Show ThreadStatus Source #

Since: base-4.3.0.0

Show NestedAtomically Source #

Since: base-4.0

Show NoMethodError Source #

Since: base-4.0

Show NonTermination Source #

Since: base-4.0

Show PatternMatchFail Source #

Since: base-4.0

Show RecConError Source #

Since: base-4.0

Show RecSelError Source #

Since: base-4.0

Show RecUpdError Source #

Since: base-4.0

Show TypeError Source #

Since: base-4.9.0.0

Show Constr Source #

Since: base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show ConstrRep Source #

Since: base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show DataRep Source #

Since: base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show DataType Source #

Since: base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show Fixity Source #

Since: base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show Dynamic Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Dynamic

Show All Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Show Any Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Show SomeTypeRep Source #

Since: base-4.10.0.0

Show Version Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Version

Show ControlMessage Source #

Since: base-4.4.0.0

Instance details

Defined in GHC.Internal.Event.Control

Methods

showsPrec :: Int -> ControlMessage -> ShowS Source #

show :: ControlMessage -> String Source #

showList :: [ControlMessage] -> ShowS Source #

Show Event Source #

Since: base-4.4.0.0

Instance details

Defined in GHC.Internal.Event.Internal.Types

Show EventLifetime Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.Event.Internal.Types

Methods

showsPrec :: Int -> EventLifetime -> ShowS Source #

show :: EventLifetime -> String Source #

showList :: [EventLifetime] -> ShowS Source #

Show Lifetime Source #

Since: base-4.8.1.0

Show Timeout Source #

Since: base-4.4.0.0

Instance details

Defined in GHC.Internal.Event.Internal.Types

Methods

showsPrec :: Int -> Timeout -> ShowS Source #

show :: Timeout -> String Source #

showList :: [Timeout] -> ShowS Source #

Show FdKey Source #

Since: base-4.4.0.0

Instance details

Defined in GHC.Internal.Event.Manager

Show State Source #

Since: base-4.4.0.0

Instance details

Defined in GHC.Internal.Event.Manager

Methods

showsPrec :: Int -> State -> ShowS Source #

show :: State -> String Source #

showList :: [State] -> ShowS Source #

Show State Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Event.TimerManager

Methods

showsPrec :: Int -> State -> ShowS Source #

show :: State -> String Source #

showList :: [State] -> ShowS Source #

Show Unique Source #

Since: base-4.3.1.0

Instance details

Defined in GHC.Internal.Event.Unique

Methods

showsPrec :: Int -> Unique -> ShowS Source #

show :: Unique -> String Source #

showList :: [Unique] -> ShowS Source #

Show ErrorCall Source #

Since: base-4.0.0.0

Instance details

Defined in GHC.Internal.Exception

Show ArithException Source #

Since: base-4.0.0.0

Show SomeException Source #

Since: ghc-internal-3.0

Show Fingerprint Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.C.Types

Instance details

Defined in GHC.Internal.Foreign.Ptr

Instance details

Defined in GHC.Internal.Foreign.Ptr

Show Associativity Source #

Since: base-4.6.0.0

Show DecidedStrictness Source #

Since: base-4.9.0.0

Show Fixity Source #

Since: base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Show SourceStrictness Source #

Since: base-4.9.0.0

Show SourceUnpackedness Source #

Since: base-4.9.0.0

Show MaskingState Source #

Since: base-4.3.0.0

Instance details

Defined in GHC.Internal.IO

Show SeekMode Source #

Since: base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Device

Show CodingFailureMode Source #

Since: base-4.4.0.0

Show CodingProgress Source #

Since: base-4.4.0.0

Show TextEncoding Source #

Since: base-4.3.0.0

Show AllocationLimitExceeded Source #

Since: base-4.7.1.0

Show ArrayException Source #

Since: base-4.1.0.0

Show AssertionFailed Source #

Since: base-4.1.0.0

Show AsyncException Source #

Since: base-4.1.0.0

Show BlockedIndefinitelyOnMVar Source #

Since: base-4.1.0.0

Show BlockedIndefinitelyOnSTM Source #

Since: base-4.1.0.0

Show CompactionFailed Source #

Since: base-4.10.0.0

Show Deadlock Source #

Since: base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Instance details

Defined in GHC.Internal.IO.Exception

Show FixIOException Source #

Since: base-4.11.0.0

Show IOErrorType Source #

Since: base-4.1.0.0

Show IOException Source #

Since: base-4.1.0.0

Show SomeAsyncException Source #

Since: base-4.7.0.0

Show FD Source #

Since: base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.FD

Methods

showsPrec :: Int -> FD -> ShowS Source #

show :: FD -> String Source #

showList :: [FD] -> ShowS Source #

Show HandlePosn Source #

Since: base-4.1.0.0

Show FileLockingNotSupported Source #

Since: base-4.10.0.0

Show BufferMode Source #

Since: base-4.2.0.0

Show Handle Source #

Since: base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show HandleType Source #

Since: base-4.1.0.0

Show Newline Source #

Since: base-4.3.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show NewlineMode Source #

Since: base-4.3.0.0

Show IOMode Source #

Since: base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.IOMode

Show IOPortException Source #
Instance details

Defined in GHC.Internal.IOPort

Methods

showsPrec :: Int -> IOPortException -> ShowS Source #

show :: IOPortException -> String Source #

showList :: [IOPortException] -> ShowS Source #

Instance details

Defined in GHC.Internal.InfoProv.Types

Show Int16 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Int

Show Int32 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Int

Show Int64 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Int

Show Int8 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Int

Show CCFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show ConcFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show DebugFlags Source #

Since: base-4.8.0.0

Show DoCostCentres Source #

Since: base-4.8.0.0

Show DoHeapProfile Source #

Since: base-4.8.0.0

Show DoTrace Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show GCFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show GiveGCStats Source #

Since: base-4.8.0.0

Show HpcFlags Source #

Since: base-4.20.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show MiscFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show ParFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show ProfFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show RTSFlags Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show TickyFlags Source #

Since: base-4.8.0.0

Show TraceFlags Source #

Since: base-4.8.0.0

Show CallStack Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show SrcLoc Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show StaticPtrInfo Source #

Since: base-4.8.0.0

Show GCDetails Source #

Since: base-4.10.0.0

Instance details

Defined in GHC.Internal.Stats

Show RTSStats Source #

Since: base-4.10.0.0

Instance details

Defined in GHC.Internal.Stats

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> Fd -> ShowS Source #

show :: Fd -> String Source #

showList :: [Fd] -> ShowS Source #

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Instance details

Defined in GHC.Internal.TH.Syntax

Show Lexeme Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Text.Read.Lex

Show Number Source #

Since: base-4.6.0.0

Instance details

Defined in GHC.Internal.Text.Read.Lex

Instance details

Defined in GHC.Internal.TypeLits

Show SomeSymbol Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.TypeLits

Show SomeNat Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.TypeNats

Show GeneralCategory Source #

Since: base-2.1

Show Word16 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Word

Show Word32 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Word

Show Word64 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Word

Show Word8 Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Word

Instance details

Defined in GHC.Internal.Show

Show Module Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show Ordering Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show TrName Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show TyCon Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show TypeLitSort Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show Integer Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show Natural Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.Show

Show () Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> () -> ShowS Source #

show :: () -> String Source #

showList :: [()] -> ShowS Source #

Show Bool Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show Char Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show Int Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show Levity Source #

Since: base-4.15.0.0

Instance details

Defined in GHC.Internal.Show

Show RuntimeRep Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show VecCount Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show VecElem Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show Word Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Show a => Show (Complex a) Source #

Since: base-2.1

Instance details

Defined in Data.Complex

Show a => Show (First a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> First a -> ShowS Source #

show :: First a -> String Source #

showList :: [First a] -> ShowS Source #

Show a => Show (Last a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Last a -> ShowS Source #

show :: Last a -> String Source #

showList :: [Last a] -> ShowS Source #

Show a => Show (Max a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Max a -> ShowS Source #

show :: Max a -> String Source #

showList :: [Max a] -> ShowS Source #

Show a => Show (Min a) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Min a -> ShowS Source #

show :: Min a -> String Source #

showList :: [Min a] -> ShowS Source #

Show m => Show (WrappedMonoid m) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (NonEmpty a) Source #

Since: base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show a => Show (And a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Methods

showsPrec :: Int -> And a -> ShowS Source #

show :: And a -> String Source #

showList :: [And a] -> ShowS Source #

Show a => Show (Iff a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Methods

showsPrec :: Int -> Iff a -> ShowS Source #

show :: Iff a -> String Source #

showList :: [Iff a] -> ShowS Source #

Show a => Show (Ior a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Methods

showsPrec :: Int -> Ior a -> ShowS Source #

show :: Ior a -> String Source #

showList :: [Ior a] -> ShowS Source #

Show a => Show (Xor a) Source #

Since: base-4.16

Instance details

Defined in GHC.Internal.Data.Bits

Methods

showsPrec :: Int -> Xor a -> ShowS Source #

show :: Xor a -> String Source #

showList :: [Xor a] -> ShowS Source #

Show a => Show (Identity a) Source #

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Show a => Show (First a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS Source #

show :: First a -> String Source #

showList :: [First a] -> ShowS Source #

Show a => Show (Last a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

showsPrec :: Int -> Last a -> ShowS Source #

show :: Last a -> String Source #

showList :: [Last a] -> ShowS Source #

Show a => Show (Down a) Source #

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS Source #

show :: Down a -> String Source #

showList :: [Down a] -> ShowS Source #

Show a => Show (Dual a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Dual a -> ShowS Source #

show :: Dual a -> String Source #

showList :: [Dual a] -> ShowS Source #

Show a => Show (Product a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Show a => Show (Sum a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS Source #

show :: Sum a -> String Source #

showList :: [Sum a] -> ShowS Source #

Instance details

Defined in GHC.Internal.Exception.Type

Instance details

Defined in GHC.Internal.Foreign.C.ConstPtr

Show (ForeignPtr a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.ForeignPtr

Show a => Show (ZipList a) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Show p => Show (Par1 p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> Par1 p -> ShowS Source #

show :: Par1 p -> String Source #

showList :: [Par1 p] -> ShowS Source #

Show (FunPtr a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Ptr

Show (Ptr a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS Source #

show :: Ptr a -> String Source #

showList :: [Ptr a] -> ShowS Source #

Show a => Show (Ratio a) Source #

Since: base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS Source #

show :: Ratio a -> String Source #

showList :: [Ratio a] -> ShowS Source #

Show flag => Show (TyVarBndr flag) Source #
Instance details

Defined in GHC.Internal.TH.Syntax

Methods

showsPrec :: Int -> TyVarBndr flag -> ShowS Source #

show :: TyVarBndr flag -> String Source #

showList :: [TyVarBndr flag] -> ShowS Source #

Show (SChar c) Source #

Since: base-4.18.0.0

Instance details

Defined in GHC.Internal.TypeLits

Methods

showsPrec :: Int -> SChar c -> ShowS Source #

show :: SChar c -> String Source #

showList :: [SChar c] -> ShowS Source #

Show (SSymbol s) Source #

Since: base-4.18.0.0

Instance details

Defined in GHC.Internal.TypeLits

Show (SNat n) Source #

Since: base-4.18.0.0

Instance details

Defined in GHC.Internal.TypeNats

Methods

showsPrec :: Int -> SNat n -> ShowS Source #

show :: SNat n -> String Source #

showList :: [SNat n] -> ShowS Source #

Show a => Show (Maybe a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS Source #

show :: Maybe a -> String Source #

showList :: [Maybe a] -> ShowS Source #

Show a => Show (Solo a) Source #

Since: base-4.15

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Solo a -> ShowS Source #

show :: Solo a -> String Source #

showList :: [Solo a] -> ShowS Source #

Show a => Show [a] Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> [a] -> ShowS Source #

show :: [a] -> String Source #

showList :: [[a]] -> ShowS Source #

HasResolution a => Show (Fixed a) Source #

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

showsPrec :: Int -> Fixed a -> ShowS Source #

show :: Fixed a -> String Source #

showList :: [Fixed a] -> ShowS Source #

(Show a, Show b) => Show (Arg a b) Source #

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS Source #

show :: Arg a b -> String Source #

showList :: [Arg a b] -> ShowS Source #

(Ix a, Show a, Show b) => Show (Array a b) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Arr

Methods

showsPrec :: Int -> Array a b -> ShowS Source #

show :: Array a b -> String Source #

showList :: [Array a b] -> ShowS Source #

(Show a, Show b) => Show (Either a b) Source #

Since: base-3.0

Instance details

Defined in GHC.Internal.Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS Source #

show :: Either a b -> String Source #

showList :: [Either a b] -> ShowS Source #

Show (Proxy s) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS Source #

show :: Proxy s -> String Source #

showList :: [Proxy s] -> ShowS Source #

Instance details

Defined in GHC.Internal.Data.Typeable.Internal

Show (U1 p) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS Source #

show :: U1 p -> String Source #

showList :: [U1 p] -> ShowS Source #

Show (UAddr p) Source #

Since: base-4.21.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> UAddr p -> ShowS Source #

show :: UAddr p -> String Source #

showList :: [UAddr p] -> ShowS Source #

Show (V1 p) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS Source #

show :: V1 p -> String Source #

showList :: [V1 p] -> ShowS Source #

Show (ST s a) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.ST

Methods

showsPrec :: Int -> ST s a -> ShowS Source #

show :: ST s a -> String Source #

showList :: [ST s a] -> ShowS Source #

(Show a, Show b) => Show (a, b) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b) -> ShowS Source #

show :: (a, b) -> String Source #

showList :: [(a, b)] -> ShowS Source #

Show (a -> b) Source #

Since: base-2.1

Instance details

Defined in Text.Show.Functions

Methods

showsPrec :: Int -> (a -> b) -> ShowS Source #

show :: (a -> b) -> String Source #

showList :: [a -> b] -> ShowS Source #

Show a => Show (Const a b) Source #

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS Source #

show :: Const a b -> String Source #

showList :: [Const a b] -> ShowS Source #

Show (f a) => Show (Ap f a) Source #

Since: base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

showsPrec :: Int -> Ap f a -> ShowS Source #

show :: Ap f a -> String Source #

showList :: [Ap f a] -> ShowS Source #

Show (f a) => Show (Alt f a) Source #

Since: base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Alt f a -> ShowS Source #

show :: Alt f a -> String Source #

showList :: [Alt f a] -> ShowS Source #

Show (Coercion a b) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Type.Coercion

Methods

showsPrec :: Int -> Coercion a b -> ShowS Source #

show :: Coercion a b -> String Source #

showList :: [Coercion a b] -> ShowS Source #

Show (a :~: b) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

showsPrec :: Int -> (a :~: b) -> ShowS Source #

show :: (a :~: b) -> String Source #

showList :: [a :~: b] -> ShowS Source #

Instance details

Defined in GHC.Internal.Data.Type.Ord

Show (f p) => Show (Rec1 f p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> Rec1 f p -> ShowS Source #

show :: Rec1 f p -> String Source #

showList :: [Rec1 f p] -> ShowS Source #

Show (URec Char p) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Show (URec Double p) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Instance details

Defined in GHC.Internal.Generics

Show (URec Int p) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS Source #

show :: URec Int p -> String Source #

showList :: [URec Int p] -> ShowS Source #

Show (URec Word p) Source #

Since: base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

(Show a, Show b, Show c) => Show (a, b, c) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c) -> ShowS Source #

show :: (a, b, c) -> String Source #

showList :: [(a, b, c)] -> ShowS Source #

(Show (f a), Show (g a)) => Show (Product f g a) Source #

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Product

Methods

showsPrec :: Int -> Product f g a -> ShowS Source #

show :: Product f g a -> String Source #

showList :: [Product f g a] -> ShowS Source #

(Show (f a), Show (g a)) => Show (Sum f g a) Source #

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Sum

Methods

showsPrec :: Int -> Sum f g a -> ShowS Source #

show :: Sum f g a -> String Source #

showList :: [Sum f g a] -> ShowS Source #

Show (a :~~: b) Source #

Since: base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

showsPrec :: Int -> (a :~~: b) -> ShowS Source #

show :: (a :~~: b) -> String Source #

showList :: [a :~~: b] -> ShowS Source #

(Show (f p), Show (g p)) => Show ((f :*: g) p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> (f :*: g) p -> ShowS Source #

show :: (f :*: g) p -> String Source #

showList :: [(f :*: g) p] -> ShowS Source #

(Show (f p), Show (g p)) => Show ((f :+: g) p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> (f :+: g) p -> ShowS Source #

show :: (f :+: g) p -> String Source #

showList :: [(f :+: g) p] -> ShowS Source #

Show c => Show (K1 i c p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> K1 i c p -> ShowS Source #

show :: K1 i c p -> String Source #

showList :: [K1 i c p] -> ShowS Source #

(Show a, Show b, Show c, Show d) => Show (a, b, c, d) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d) -> ShowS Source #

show :: (a, b, c, d) -> String Source #

showList :: [(a, b, c, d)] -> ShowS Source #

Show (f (g a)) => Show (Compose f g a) Source #

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Compose

Methods

showsPrec :: Int -> Compose f g a -> ShowS Source #

show :: Compose f g a -> String Source #

showList :: [Compose f g a] -> ShowS Source #

Show (f (g p)) => Show ((f :.: g) p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> (f :.: g) p -> ShowS Source #

show :: (f :.: g) p -> String Source #

showList :: [(f :.: g) p] -> ShowS Source #

Show (f p) => Show (M1 i c f p) Source #

Since: base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> M1 i c f p -> ShowS Source #

show :: M1 i c f p -> String Source #

showList :: [M1 i c f p] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e) -> ShowS Source #

show :: (a, b, c, d, e) -> String Source #

showList :: [(a, b, c, d, e)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f) -> ShowS Source #

show :: (a, b, c, d, e, f) -> String Source #

showList :: [(a, b, c, d, e, f)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g) -> ShowS Source #

show :: (a, b, c, d, e, f, g) -> String Source #

showList :: [(a, b, c, d, e, f, g)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h) -> String Source #

showList :: [(a, b, c, d, e, f, g, h)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i, j) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i, j)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i, j, k) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i, j, k, l) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> ShowS Source #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) Source #

Since: base-2.1

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> ShowS Source #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> String Source #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> ShowS Source #

type ShowS = String -> String Source #

The shows functions return a function that prepends the output String to an existing String . This allows constant-time concatenation of results using function composition.

Show support code

shows :: Show a => a -> ShowS Source #

equivalent to showsPrec with a precedence of 0.

showChar :: Char -> ShowS Source #

utility function converting a Char to a show function that simply prepends the character unchanged.

showString :: String -> ShowS Source #

utility function converting a String to a show function that simply prepends the string unchanged.

showMultiLineString :: String -> [String] Source #

Like showLitString (expand escape characters using Haskell escape conventions), but * break the string into multiple lines * wrap the entire thing in double quotes Example: showMultiLineString "hellongoodbyenblah" returns [""hello\n\", "\goodbyen\", "\blah""]

showParen :: Bool -> ShowS -> ShowS Source #

utility function that surrounds the inner show function with parentheses when the Bool parameter is True .

showList__ :: (a -> ShowS) -> [a] -> ShowS Source #

showCommaSpace :: ShowS Source #

showSpace :: ShowS Source #

showLitChar :: Char -> ShowS Source #

Convert a character to a string using only printable characters, using Haskell source-language escape conventions. For example:

showLitChar '\n' s = "\\n" ++ s

showLitString :: String -> ShowS Source #

Same as showLitChar , but for strings It converts the string to a string using Haskell escape conventions for non-printable characters. Does not add double-quotes around the whole thing; the caller should do that. The main difference from showLitChar (apart from the fact that the argument is a string not a list) is that we must escape double-quotes

protectEsc :: (Char -> Bool) -> ShowS -> ShowS Source #

intToDigit :: Int -> Char Source #

Convert an Int in the range 0..15 to the corresponding single digit Char . This function fails on other inputs, and generates lower-case hexadecimal digits.

showSignedInt :: Int -> Int -> ShowS Source #

appPrec :: Int Source #

appPrec1 :: Int Source #

Character operations

asciiTab :: [String] Source #

AltStyle によって変換されたページ (->オリジナル) /