Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- type Prefixed str = CustomJSON '[FieldLabelModifier (StripPrefix str)]
- type PrefixedSnake str = CustomJSON '[FieldLabelModifier (StripPrefix str, CamelToSnake)]
- type Snake = CustomJSON '[FieldLabelModifier CamelToSnake]
- class FromJSON a
- class ToJSON a
- class Generic a
Documentation
type Prefixed str = CustomJSON '[FieldLabelModifier (StripPrefix str)] Source #
Field names are prefixed by str
; strip them from JSON representation
type PrefixedSnake str = CustomJSON '[FieldLabelModifier (StripPrefix str, CamelToSnake)] Source #
Strip str
prefices and convert from CamelCase to snake_case
type Snake = CustomJSON '[FieldLabelModifier CamelToSnake] Source #
Convert from CamelCase to snake_case
Reexports
Instances
FromJSON Bool | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Bool parseJSONList :: Value -> Parser [Bool] | |
FromJSON Char | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Char parseJSONList :: Value -> Parser [Char] | |
FromJSON Double | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Double parseJSONList :: Value -> Parser [Double] | |
FromJSON Float | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Float parseJSONList :: Value -> Parser [Float] | |
FromJSON Int | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Int parseJSONList :: Value -> Parser [Int] | |
FromJSON Int8 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Int8 parseJSONList :: Value -> Parser [Int8] | |
FromJSON Int16 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Int16 parseJSONList :: Value -> Parser [Int16] | |
FromJSON Int32 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Int32 parseJSONList :: Value -> Parser [Int32] | |
FromJSON Int64 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Int64 parseJSONList :: Value -> Parser [Int64] | |
FromJSON Integer | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Integer parseJSONList :: Value -> Parser [Integer] | |
FromJSON Natural | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Natural parseJSONList :: Value -> Parser [Natural] | |
FromJSON Ordering | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Ordering parseJSONList :: Value -> Parser [Ordering] | |
FromJSON Word | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Word parseJSONList :: Value -> Parser [Word] | |
FromJSON Word8 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Word8 parseJSONList :: Value -> Parser [Word8] | |
FromJSON Word16 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Word16 parseJSONList :: Value -> Parser [Word16] | |
FromJSON Word32 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Word32 parseJSONList :: Value -> Parser [Word32] | |
FromJSON Word64 | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Word64 parseJSONList :: Value -> Parser [Word64] | |
FromJSON () | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser () parseJSONList :: Value -> Parser [()] | |
FromJSON Void | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Void parseJSONList :: Value -> Parser [Void] | |
FromJSON Version | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Version parseJSONList :: Value -> Parser [Version] | |
FromJSON CTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser CTime parseJSONList :: Value -> Parser [CTime] | |
FromJSON IntSet | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser IntSet parseJSONList :: Value -> Parser [IntSet] | |
FromJSON Text | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Text parseJSONList :: Value -> Parser [Text] | |
FromJSON Text | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Text parseJSONList :: Value -> Parser [Text] | |
FromJSON ZonedTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser ZonedTime parseJSONList :: Value -> Parser [ZonedTime] | |
FromJSON LocalTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser LocalTime parseJSONList :: Value -> Parser [LocalTime] | |
FromJSON TimeOfDay | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser TimeOfDay parseJSONList :: Value -> Parser [TimeOfDay] | |
FromJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser CalendarDiffTime parseJSONList :: Value -> Parser [CalendarDiffTime] | |
FromJSON UTCTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser UTCTime parseJSONList :: Value -> Parser [UTCTime] | |
FromJSON SystemTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser SystemTime parseJSONList :: Value -> Parser [SystemTime] | |
FromJSON NominalDiffTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser NominalDiffTime parseJSONList :: Value -> Parser [NominalDiffTime] | |
FromJSON DiffTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser DiffTime parseJSONList :: Value -> Parser [DiffTime] | |
FromJSON DayOfWeek | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser DayOfWeek parseJSONList :: Value -> Parser [DayOfWeek] | |
FromJSON Day | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Day parseJSONList :: Value -> Parser [Day] | |
FromJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser CalendarDiffDays parseJSONList :: Value -> Parser [CalendarDiffDays] | |
FromJSON DotNetTime | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser DotNetTime parseJSONList :: Value -> Parser [DotNetTime] | |
FromJSON Value | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Value parseJSONList :: Value -> Parser [Value] | |
FromJSON Scientific | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser Scientific parseJSONList :: Value -> Parser [Scientific] | |
FromJSON UUID | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser UUID parseJSONList :: Value -> Parser [UUID] | |
FromJSON a => FromJSON [a] | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser [a] parseJSONList :: Value -> Parser [[a]] | |
FromJSON a => FromJSON (Maybe a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Maybe a) parseJSONList :: Value -> Parser [Maybe a] | |
(FromJSON a, Integral a) => FromJSON (Ratio a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Ratio a) parseJSONList :: Value -> Parser [Ratio a] | |
HasResolution a => FromJSON (Fixed a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Fixed a) parseJSONList :: Value -> Parser [Fixed a] | |
FromJSON a => FromJSON (Min a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Min a) parseJSONList :: Value -> Parser [Min a] | |
FromJSON a => FromJSON (Max a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Max a) parseJSONList :: Value -> Parser [Max a] | |
FromJSON a => FromJSON (First a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (First a) parseJSONList :: Value -> Parser [First a] | |
FromJSON a => FromJSON (Last a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Last a) parseJSONList :: Value -> Parser [Last a] | |
FromJSON a => FromJSON (WrappedMonoid a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (WrappedMonoid a) parseJSONList :: Value -> Parser [WrappedMonoid a] | |
FromJSON a => FromJSON (Option a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Option a) parseJSONList :: Value -> Parser [Option a] | |
FromJSON a => FromJSON (Identity a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Identity a) parseJSONList :: Value -> Parser [Identity a] | |
FromJSON a => FromJSON (First a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (First a) parseJSONList :: Value -> Parser [First a] | |
FromJSON a => FromJSON (Last a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Last a) parseJSONList :: Value -> Parser [Last a] | |
FromJSON a => FromJSON (Dual a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Dual a) parseJSONList :: Value -> Parser [Dual a] | |
FromJSON a => FromJSON (NonEmpty a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (NonEmpty a) parseJSONList :: Value -> Parser [NonEmpty a] | |
FromJSON a => FromJSON (IntMap a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (IntMap a) parseJSONList :: Value -> Parser [IntMap a] | |
FromJSON v => FromJSON (Tree v) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Tree v) parseJSONList :: Value -> Parser [Tree v] | |
FromJSON a => FromJSON (Seq a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Seq a) parseJSONList :: Value -> Parser [Seq a] | |
(Ord a, FromJSON a) => FromJSON (Set a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Set a) parseJSONList :: Value -> Parser [Set a] | |
(Vector Vector a, FromJSON a) => FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Vector a) parseJSONList :: Value -> Parser [Vector a] | |
FromJSON a => FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Vector a) parseJSONList :: Value -> Parser [Vector a] | |
FromJSON a => FromJSON (DList a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (DList a) parseJSONList :: Value -> Parser [DList a] | |
(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (HashSet a) parseJSONList :: Value -> Parser [HashSet a] | |
FromJSON a => FromJSON (Array a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Array a) parseJSONList :: Value -> Parser [Array a] | |
(Prim a, FromJSON a) => FromJSON (PrimArray a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (PrimArray a) parseJSONList :: Value -> Parser [PrimArray a] | |
FromJSON a => FromJSON (SmallArray a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (SmallArray a) parseJSONList :: Value -> Parser [SmallArray a] | |
(Prim a, FromJSON a) => FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Vector a) parseJSONList :: Value -> Parser [Vector a] | |
(Storable a, FromJSON a) => FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Vector a) parseJSONList :: Value -> Parser [Vector a] | |
(FromJSON a, FromJSON b) => FromJSON (Either a b) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Either a b) parseJSONList :: Value -> Parser [Either a b] | |
(FromJSON a, FromJSON b) => FromJSON (a, b) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b) parseJSONList :: Value -> Parser [(a, b)] | |
FromJSON (Proxy a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Proxy a) parseJSONList :: Value -> Parser [Proxy a] | |
(FromJSONKey k, Ord k, FromJSON v) => FromJSON (Map k v) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Map k v) parseJSONList :: Value -> Parser [Map k v] | |
(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (HashMap k v) parseJSONList :: Value -> Parser [HashMap k v] | |
(FromJSON a, FromJSON b, FromJSON c) => FromJSON (a, b, c) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c) parseJSONList :: Value -> Parser [(a, b, c)] | |
FromJSON a => FromJSON (Const a b) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Const a b) parseJSONList :: Value -> Parser [Const a b] | |
(AesonOptions t, Generic a, GFromJSON Zero (Rep a)) => FromJSON (CustomJSON t a) Source # | |
Defined in Deriving.Aeson parseJSON :: Value -> Parser (CustomJSON t a) parseJSONList :: Value -> Parser [CustomJSON t a] | |
FromJSON b => FromJSON (Tagged a b) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Tagged a b) parseJSONList :: Value -> Parser [Tagged a b] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d) => FromJSON (a, b, c, d) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d) parseJSONList :: Value -> Parser [(a, b, c, d)] | |
(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Product f g a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Product f g a) parseJSONList :: Value -> Parser [Product f g a] | |
(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Sum f g a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Sum f g a) parseJSONList :: Value -> Parser [Sum f g a] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e) => FromJSON (a, b, c, d, e) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e) parseJSONList :: Value -> Parser [(a, b, c, d, e)] | |
(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Compose f g a) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (Compose f g a) parseJSONList :: Value -> Parser [Compose f g a] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f) => FromJSON (a, b, c, d, e, f) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f) parseJSONList :: Value -> Parser [(a, b, c, d, e, f)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g) => FromJSON (a, b, c, d, e, f, g) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h) => FromJSON (a, b, c, d, e, f, g, h) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i) => FromJSON (a, b, c, d, e, f, g, h, i) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j) => FromJSON (a, b, c, d, e, f, g, h, i, j) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k) => FromJSON (a, b, c, d, e, f, g, h, i, j, k) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n, FromJSON o) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | |
Defined in Data.Aeson.Types.FromJSON parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] |
Instances
ToJSON Bool | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Char | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Double | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Double -> Encoding toJSONList :: [Double] -> Value toEncodingList :: [Double] -> Encoding | |
ToJSON Float | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Int | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Int8 | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Int16 | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Int32 | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Int64 | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Integer | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Integer -> Encoding toJSONList :: [Integer] -> Value toEncodingList :: [Integer] -> Encoding | |
ToJSON Natural | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Natural -> Encoding toJSONList :: [Natural] -> Value toEncodingList :: [Natural] -> Encoding | |
ToJSON Ordering | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Ordering -> Encoding toJSONList :: [Ordering] -> Value toEncodingList :: [Ordering] -> Encoding | |
ToJSON Word | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Word8 | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Word16 | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Word16 -> Encoding toJSONList :: [Word16] -> Value toEncodingList :: [Word16] -> Encoding | |
ToJSON Word32 | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Word32 -> Encoding toJSONList :: [Word32] -> Value toEncodingList :: [Word32] -> Encoding | |
ToJSON Word64 | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Word64 -> Encoding toJSONList :: [Word64] -> Value toEncodingList :: [Word64] -> Encoding | |
ToJSON () | |
Defined in Data.Aeson.Types.ToJSON toJSON :: () -> Value toEncoding :: () -> Encoding toJSONList :: [()] -> Value toEncodingList :: [()] -> Encoding | |
ToJSON Void | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Version | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Version -> Encoding toJSONList :: [Version] -> Value toEncodingList :: [Version] -> Encoding | |
ToJSON CTime | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON IntSet | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: IntSet -> Encoding toJSONList :: [IntSet] -> Value toEncodingList :: [IntSet] -> Encoding | |
ToJSON Text | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Text | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON ZonedTime | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: ZonedTime -> Encoding toJSONList :: [ZonedTime] -> Value toEncodingList :: [ZonedTime] -> Encoding | |
ToJSON LocalTime | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: LocalTime -> Encoding toJSONList :: [LocalTime] -> Value toEncodingList :: [LocalTime] -> Encoding | |
ToJSON TimeOfDay | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: TimeOfDay -> Encoding toJSONList :: [TimeOfDay] -> Value toEncodingList :: [TimeOfDay] -> Encoding | |
ToJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.ToJSON toJSON :: CalendarDiffTime -> Value toEncoding :: CalendarDiffTime -> Encoding toJSONList :: [CalendarDiffTime] -> Value toEncodingList :: [CalendarDiffTime] -> Encoding | |
ToJSON UTCTime | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: UTCTime -> Encoding toJSONList :: [UTCTime] -> Value toEncodingList :: [UTCTime] -> Encoding | |
ToJSON SystemTime | |
Defined in Data.Aeson.Types.ToJSON toJSON :: SystemTime -> Value toEncoding :: SystemTime -> Encoding toJSONList :: [SystemTime] -> Value toEncodingList :: [SystemTime] -> Encoding | |
ToJSON NominalDiffTime | |
Defined in Data.Aeson.Types.ToJSON toJSON :: NominalDiffTime -> Value toEncoding :: NominalDiffTime -> Encoding toJSONList :: [NominalDiffTime] -> Value toEncodingList :: [NominalDiffTime] -> Encoding | |
ToJSON DiffTime | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: DiffTime -> Encoding toJSONList :: [DiffTime] -> Value toEncodingList :: [DiffTime] -> Encoding | |
ToJSON DayOfWeek | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: DayOfWeek -> Encoding toJSONList :: [DayOfWeek] -> Value toEncodingList :: [DayOfWeek] -> Encoding | |
ToJSON Day | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.ToJSON toJSON :: CalendarDiffDays -> Value toEncoding :: CalendarDiffDays -> Encoding toJSONList :: [CalendarDiffDays] -> Value toEncodingList :: [CalendarDiffDays] -> Encoding | |
ToJSON DotNetTime | |
Defined in Data.Aeson.Types.ToJSON toJSON :: DotNetTime -> Value toEncoding :: DotNetTime -> Encoding toJSONList :: [DotNetTime] -> Value toEncodingList :: [DotNetTime] -> Encoding | |
ToJSON Value | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Value -> Value toEncoding :: Value -> Encoding toJSONList :: [Value] -> Value toEncodingList :: [Value] -> Encoding | |
ToJSON Number | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Number -> Value toEncoding :: Number -> Encoding toJSONList :: [Number] -> Value toEncodingList :: [Number] -> Encoding | |
ToJSON Scientific | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Scientific -> Value toEncoding :: Scientific -> Encoding toJSONList :: [Scientific] -> Value toEncodingList :: [Scientific] -> Encoding | |
ToJSON UUID | |
Defined in Data.Aeson.Types.ToJSON toJSON :: UUID -> Value toEncoding :: UUID -> Encoding toJSONList :: [UUID] -> Value toEncodingList :: [UUID] -> Encoding | |
ToJSON a => ToJSON [a] | |
Defined in Data.Aeson.Types.ToJSON toJSON :: [a] -> Value toEncoding :: [a] -> Encoding toJSONList :: [[a]] -> Value toEncodingList :: [[a]] -> Encoding | |
ToJSON a => ToJSON (Maybe a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Maybe a -> Encoding toJSONList :: [Maybe a] -> Value toEncodingList :: [Maybe a] -> Encoding | |
(ToJSON a, Integral a) => ToJSON (Ratio a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Ratio a -> Encoding toJSONList :: [Ratio a] -> Value toEncodingList :: [Ratio a] -> Encoding | |
HasResolution a => ToJSON (Fixed a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Fixed a -> Encoding toJSONList :: [Fixed a] -> Value toEncodingList :: [Fixed a] -> Encoding | |
ToJSON a => ToJSON (Min a) | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON a => ToJSON (Max a) | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON a => ToJSON (First a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: First a -> Encoding toJSONList :: [First a] -> Value toEncodingList :: [First a] -> Encoding | |
ToJSON a => ToJSON (Last a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Last a -> Encoding toJSONList :: [Last a] -> Value toEncodingList :: [Last a] -> Encoding | |
ToJSON a => ToJSON (WrappedMonoid a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: WrappedMonoid a -> Value toEncoding :: WrappedMonoid a -> Encoding toJSONList :: [WrappedMonoid a] -> Value toEncodingList :: [WrappedMonoid a] -> Encoding | |
ToJSON a => ToJSON (Option a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Option a -> Encoding toJSONList :: [Option a] -> Value toEncodingList :: [Option a] -> Encoding | |
ToJSON a => ToJSON (Identity a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Identity a -> Encoding toJSONList :: [Identity a] -> Value toEncodingList :: [Identity a] -> Encoding | |
ToJSON a => ToJSON (First a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: First a -> Encoding toJSONList :: [First a] -> Value toEncodingList :: [First a] -> Encoding | |
ToJSON a => ToJSON (Last a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Last a -> Encoding toJSONList :: [Last a] -> Value toEncodingList :: [Last a] -> Encoding | |
ToJSON a => ToJSON (Dual a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Dual a -> Encoding toJSONList :: [Dual a] -> Value toEncodingList :: [Dual a] -> Encoding | |
ToJSON a => ToJSON (NonEmpty a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: NonEmpty a -> Encoding toJSONList :: [NonEmpty a] -> Value toEncodingList :: [NonEmpty a] -> Encoding | |
ToJSON a => ToJSON (IntMap a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: IntMap a -> Encoding toJSONList :: [IntMap a] -> Value toEncodingList :: [IntMap a] -> Encoding | |
ToJSON v => ToJSON (Tree v) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Tree v -> Encoding toJSONList :: [Tree v] -> Value toEncodingList :: [Tree v] -> Encoding | |
ToJSON a => ToJSON (Seq a) | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON a => ToJSON (Set a) | |
Defined in Data.Aeson.Types.ToJSON | |
(Vector Vector a, ToJSON a) => ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Vector a -> Value toEncoding :: Vector a -> Encoding toJSONList :: [Vector a] -> Value toEncodingList :: [Vector a] -> Encoding | |
ToJSON a => ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Vector a -> Value toEncoding :: Vector a -> Encoding toJSONList :: [Vector a] -> Value toEncodingList :: [Vector a] -> Encoding | |
ToJSON a => ToJSON (DList a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: DList a -> Value toEncoding :: DList a -> Encoding toJSONList :: [DList a] -> Value toEncodingList :: [DList a] -> Encoding | |
ToJSON a => ToJSON (HashSet a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: HashSet a -> Value toEncoding :: HashSet a -> Encoding toJSONList :: [HashSet a] -> Value toEncodingList :: [HashSet a] -> Encoding | |
ToJSON a => ToJSON (Array a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Array a -> Value toEncoding :: Array a -> Encoding toJSONList :: [Array a] -> Value toEncodingList :: [Array a] -> Encoding | |
(Prim a, ToJSON a) => ToJSON (PrimArray a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: PrimArray a -> Value toEncoding :: PrimArray a -> Encoding toJSONList :: [PrimArray a] -> Value toEncodingList :: [PrimArray a] -> Encoding | |
ToJSON a => ToJSON (SmallArray a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: SmallArray a -> Value toEncoding :: SmallArray a -> Encoding toJSONList :: [SmallArray a] -> Value toEncodingList :: [SmallArray a] -> Encoding | |
(Prim a, ToJSON a) => ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Vector a -> Value toEncoding :: Vector a -> Encoding toJSONList :: [Vector a] -> Value toEncodingList :: [Vector a] -> Encoding | |
(Storable a, ToJSON a) => ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Vector a -> Value toEncoding :: Vector a -> Encoding toJSONList :: [Vector a] -> Value toEncodingList :: [Vector a] -> Encoding | |
(ToJSON a, ToJSON b) => ToJSON (Either a b) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Either a b -> Encoding toJSONList :: [Either a b] -> Value toEncodingList :: [Either a b] -> Encoding | |
(ToJSON a, ToJSON b) => ToJSON (a, b) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b) -> Value toEncoding :: (a, b) -> Encoding toJSONList :: [(a, b)] -> Value toEncodingList :: [(a, b)] -> Encoding | |
ToJSON (Proxy a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Proxy a -> Encoding toJSONList :: [Proxy a] -> Value toEncodingList :: [Proxy a] -> Encoding | |
(ToJSON v, ToJSONKey k) => ToJSON (Map k v) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Map k v -> Encoding toJSONList :: [Map k v] -> Value toEncodingList :: [Map k v] -> Encoding | |
(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: HashMap k v -> Value toEncoding :: HashMap k v -> Encoding toJSONList :: [HashMap k v] -> Value toEncodingList :: [HashMap k v] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c) => ToJSON (a, b, c) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c) -> Value toEncoding :: (a, b, c) -> Encoding toJSONList :: [(a, b, c)] -> Value toEncodingList :: [(a, b, c)] -> Encoding | |
ToJSON a => ToJSON (Const a b) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Const a b -> Encoding toJSONList :: [Const a b] -> Value toEncodingList :: [Const a b] -> Encoding | |
(AesonOptions t, Generic a, GToJSON Zero (Rep a)) => ToJSON (CustomJSON t a) Source # | |
Defined in Deriving.Aeson toJSON :: CustomJSON t a -> Value toEncoding :: CustomJSON t a -> Encoding toJSONList :: [CustomJSON t a] -> Value toEncodingList :: [CustomJSON t a] -> Encoding | |
ToJSON b => ToJSON (Tagged a b) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Tagged a b -> Value toEncoding :: Tagged a b -> Encoding toJSONList :: [Tagged a b] -> Value toEncodingList :: [Tagged a b] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d) => ToJSON (a, b, c, d) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d) -> Value toEncoding :: (a, b, c, d) -> Encoding toJSONList :: [(a, b, c, d)] -> Value toEncodingList :: [(a, b, c, d)] -> Encoding | |
(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Product f g a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Product f g a -> Value toEncoding :: Product f g a -> Encoding toJSONList :: [Product f g a] -> Value toEncodingList :: [Product f g a] -> Encoding | |
(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Sum f g a) | |
Defined in Data.Aeson.Types.ToJSON toEncoding :: Sum f g a -> Encoding toJSONList :: [Sum f g a] -> Value toEncodingList :: [Sum f g a] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e) => ToJSON (a, b, c, d, e) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e) -> Value toEncoding :: (a, b, c, d, e) -> Encoding toJSONList :: [(a, b, c, d, e)] -> Value toEncodingList :: [(a, b, c, d, e)] -> Encoding | |
(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Compose f g a) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: Compose f g a -> Value toEncoding :: Compose f g a -> Encoding toJSONList :: [Compose f g a] -> Value toEncodingList :: [Compose f g a] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f) => ToJSON (a, b, c, d, e, f) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f) -> Value toEncoding :: (a, b, c, d, e, f) -> Encoding toJSONList :: [(a, b, c, d, e, f)] -> Value toEncodingList :: [(a, b, c, d, e, f)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g) => ToJSON (a, b, c, d, e, f, g) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g) -> Value toEncoding :: (a, b, c, d, e, f, g) -> Encoding toJSONList :: [(a, b, c, d, e, f, g)] -> Value toEncodingList :: [(a, b, c, d, e, f, g)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h) => ToJSON (a, b, c, d, e, f, g, h) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h) -> Value toEncoding :: (a, b, c, d, e, f, g, h) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i) => ToJSON (a, b, c, d, e, f, g, h, i) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j) => ToJSON (a, b, c, d, e, f, g, h, i, j) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i, j) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i, j) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i, j)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i, j)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k) => ToJSON (a, b, c, d, e, f, g, h, i, j, k) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i, j, k) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i, j, k) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Encoding | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n, ToJSON o) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | |
Defined in Data.Aeson.Types.ToJSON toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Value toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Encoding toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Value toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Encoding |
Representable types of kind *
.
This class is derivable in GHC with the DeriveGeneric
flag on.
A Generic
instance must satisfy the following laws:
from
.to
≡id
to
.from
≡id
Instances
Generic Bool | Since: base-4.6.0.0 |
Generic Ordering | Since: base-4.6.0.0 |
Generic () | Since: base-4.6.0.0 |
Generic ExitCode | |
Generic Fixity | Since: base-4.7.0.0 |
Generic Associativity | Since: base-4.7.0.0 |
Defined in GHC.Generics type Rep Associativity :: Type -> Type # from :: Associativity -> Rep Associativity x # to :: Rep Associativity x -> Associativity # | |
Generic SourceUnpackedness | Since: base-4.9.0.0 |
Defined in GHC.Generics type Rep SourceUnpackedness :: Type -> Type # from :: SourceUnpackedness -> Rep SourceUnpackedness x # to :: Rep SourceUnpackedness x -> SourceUnpackedness # | |
Generic SourceStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics type Rep SourceStrictness :: Type -> Type # from :: SourceStrictness -> Rep SourceStrictness x # to :: Rep SourceStrictness x -> SourceStrictness # | |
Generic DecidedStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics type Rep DecidedStrictness :: Type -> Type # from :: DecidedStrictness -> Rep DecidedStrictness x # to :: Rep DecidedStrictness x -> DecidedStrictness # | |
Generic Value | |
Generic [a] | Since: base-4.6.0.0 |
Generic (Maybe a) | Since: base-4.6.0.0 |
Generic (Par1 p) | Since: base-4.7.0.0 |
Generic (Down a) | Since: base-4.12.0.0 |
Generic (NonEmpty a) | Since: base-4.6.0.0 |
Generic (Either a b) | Since: base-4.6.0.0 |
Generic (V1 p) | Since: base-4.9.0.0 |
Generic (U1 p) | Since: base-4.7.0.0 |
Generic (a, b) | Since: base-4.6.0.0 |
Generic (Proxy t) | Since: base-4.6.0.0 |
Generic (Rec1 f p) | Since: base-4.7.0.0 |
Generic (URec (Ptr ()) p) | Since: base-4.9.0.0 |
Generic (URec Char p) | Since: base-4.9.0.0 |
Generic (URec Double p) | Since: base-4.9.0.0 |
Generic (URec Float p) | |
Generic (URec Int p) | Since: base-4.9.0.0 |
Generic (URec Word p) | Since: base-4.9.0.0 |
Generic (a, b, c) | Since: base-4.6.0.0 |
Generic (K1 i c p) | Since: base-4.7.0.0 |
Generic ((f :+: g) p) | Since: base-4.7.0.0 |
Generic ((f :*: g) p) | Since: base-4.7.0.0 |
Generic (a, b, c, d) | Since: base-4.6.0.0 |
Generic (M1 i c f p) | Since: base-4.7.0.0 |
Generic ((f :.: g) p) | Since: base-4.7.0.0 |
Generic (a, b, c, d, e) | Since: base-4.6.0.0 |
Generic (a, b, c, d, e, f) | Since: base-4.6.0.0 |
Generic (a, b, c, d, e, f, g) | Since: base-4.6.0.0 |