GShow Bool Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Char Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Double Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Float Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Int Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Int8 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Int16 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Int32 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Int64 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Integer Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Natural Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Ordering Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Word Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Word8 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Word16 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Word32 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Word64 Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow () Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Handle Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Void Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Version Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow HandlePosn Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Fd Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow ExitCode Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow IOErrorType Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow BufferMode Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow SeekMode Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow IOError Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow All Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Any Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Fixity Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow Associativity Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CChar Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CSChar Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CUChar Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CShort Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CUShort Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CInt Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CUInt Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CLong Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CULong Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CLLong Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CULLong Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CBool Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CFloat Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CDouble Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CPtrdiff Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CSize Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CWchar Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CSigAtomic Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CClock Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CTime Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CUSeconds Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CSUSeconds Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CIntPtr Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CUIntPtr Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CIntMax Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow CUIntMax Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow WordPtr Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow IntPtr Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow IOMode Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow GeneralCategory Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow [a] Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Maybe a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (Ptr a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (FunPtr a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow p => GShow (Par1 p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (ForeignPtr a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Complex a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Min a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Max a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (First a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Last a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow m => GShow (WrappedMonoid m) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Option a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (ZipList a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Identity a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (First a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Last a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Dual a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Sum a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Product a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Down a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (NonEmpty a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(Generic a, GShow' (Rep a)) => GShow (Default a) Source # | For example, with this type: newtype TestShow = TestShow Bool
deriving (GShow ) via (Default Bool )
gshow for TestShow would produce the same string as gshow for
Bool .
In this example, TestShow requires no Generic instance, as the
constraint on gshowsPrec from Default Bool is Generic Bool . In general, when using a newtype wrapper, the instance can be derived
via the wrapped type, as here (via Default Bool rather than Default
TestShow ). |
Instance detailsDefined in Generics.Deriving.Default |
(GShow a, GShow b) => GShow (Either a b) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (U1 p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (UChar p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (UDouble p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (UFloat p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (UInt p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (UWord p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow a, GShow b) => GShow (a, b) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow a, GShow b) => GShow (Arg a b) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (Proxy s) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (f p) => GShow (Rec1 f p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow a, GShow b, GShow c) => GShow (a, b, c) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow a => GShow (Const a b) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (f a) => GShow (Alt f a) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow c => GShow (K1 i c p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow (f p), GShow (g p)) => GShow ((f :+: g) p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow (f p), GShow (g p)) => GShow ((f :*: g) p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow a, GShow b, GShow c, GShow d) => GShow (a, b, c, d) Source # | |
Instance detailsDefined in Generics.Deriving.Show Methods gshowsPrec :: Int -> (a, b, c, d) -> ShowS Source # gshows :: (a, b, c, d) -> ShowS Source # gshow :: (a, b, c, d) -> String Source # gshowList :: [(a, b, c, d)] -> ShowS Source # |
GShow (f p) => GShow (M1 i c f p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
GShow (f (g p)) => GShow ((f :.: g) p) Source # | |
Instance detailsDefined in Generics.Deriving.Show |
(GShow a, GShow b, GShow c, GShow d, GShow e) => GShow (a, b, c, d, e) Source # | |
Instance detailsDefined in Generics.Deriving.Show Methods gshowsPrec :: Int -> (a, b, c, d, e) -> ShowS Source # gshows :: (a, b, c, d, e) -> ShowS Source # gshow :: (a, b, c, d, e) -> String Source # gshowList :: [(a, b, c, d, e)] -> ShowS Source # |
(GShow a, GShow b, GShow c, GShow d, GShow e, GShow f) => GShow (a, b, c, d, e, f) Source # | |
Instance detailsDefined in Generics.Deriving.Show Methods gshowsPrec :: Int -> (a, b, c, d, e, f) -> ShowS Source # gshows :: (a, b, c, d, e, f) -> ShowS Source # gshow :: (a, b, c, d, e, f) -> String Source # gshowList :: [(a, b, c, d, e, f)] -> ShowS Source # |
(GShow a, GShow b, GShow c, GShow d, GShow e, GShow f, GShow g) => GShow (a, b, c, d, e, f, g) Source # | |
Instance detailsDefined in Generics.Deriving.Show Methods gshowsPrec :: Int -> (a, b, c, d, e, f, g) -> ShowS Source # gshows :: (a, b, c, d, e, f, g) -> ShowS Source # gshow :: (a, b, c, d, e, f, g) -> String Source # gshowList :: [(a, b, c, d, e, f, g)] -> ShowS Source # |