JSON Bool | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Char | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Double | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Float | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Int | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Int8 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Int16 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Int32 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Int64 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Integer | This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Integer and provide your own instance using withScientific if you want to allow larger inputs. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Natural | This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Natural and provide your own instance using withScientific if you want to allow larger inputs. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Ordering | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Word | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Word8 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Word16 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Word32 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Word64 | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON () | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Version | Only round trip versionBranch as JSON array. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON NominalDiffTime | This instance includes a bounds check to prevent maliciously
large inputs to fill up the memory of the target system. You can
newtype NominalDiffTime and provide your own instance using
withScientific if you want to allow larger inputs. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON DiffTime | This instance includes a bounds check to prevent maliciously
large inputs to fill up the memory of the target system. You can
newtype DiffTime and provide your own instance using
withScientific if you want to allow larger inputs. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Scientific | Note this instance doesn't reject large input |
Instance detailsDefined in Z.Data.JSON.Base |
JSON ZonedTime | YYYY-MM-DDTHH:MM:SS.SSSZ |
Instance detailsDefined in Z.Data.JSON.Base |
JSON LocalTime | YYYY-MM-DDTHH:MM:SS.SSSZ |
Instance detailsDefined in Z.Data.JSON.Base |
JSON UTCTime | YYYY-MM-DDTHH:MM:SS.SSSZ |
Instance detailsDefined in Z.Data.JSON.Base |
JSON ByteArray | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CUIntMax | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CIntMax | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CUIntPtr | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CIntPtr | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CSUSeconds | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CUSeconds | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CTime | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CClock | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CSigAtomic | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CWchar | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CSize | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CPtrdiff | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CDouble | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CFloat | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CBool | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CULLong | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CLLong | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CULong | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CLong | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CUInt | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CInt | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CUShort | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CShort | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CUChar | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CSChar | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CChar | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CBytes | JSON instances check if CBytes is properly UTF8 encoded,
if it is, decode/encode it as Text , otherwise as an object with a base64 field. > encodeText ("hello" :: CBytes)
""hello""
> encodeText ("hello\NUL" :: CBytes) -- \NUL is encoded as C0 80, which is illegal UTF8
"{"base64":"aGVsbG/AgA=="}"
|
Instance detailsDefined in Z.Data.CBytes |
JSON Value | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON FlatIntSet | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Text | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Bytes | This is an INCOHERENT instance, encode binary data with base64 encoding. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON FileEvent | |
Instance detailsDefined in Z.IO.FileSystem.Watch |
JSON PathStyle | |
Instance detailsDefined in Z.IO.FileSystem.FilePath |
JSON DirEntType | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON UVTimeSpec | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON FStat | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON AccessResult | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON UID | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON GID | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON ProcessOptions | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON ProcessStdStream | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON TimeVal | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON ResUsage | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON PID | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON OSName | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON PassWD | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON CPUInfo | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON TimeVal64 | |
Instance detailsDefined in Z.IO.UV.FFI |
JSON SocketAddr | |
Instance detailsDefined in Z.IO.Network.SocketAddr |
JSON IPv4 | |
Instance detailsDefined in Z.IO.Network.SocketAddr |
JSON IPv6 | |
Instance detailsDefined in Z.IO.Network.SocketAddr |
JSON PortNumber | |
Instance detailsDefined in Z.IO.Network.SocketAddr |
JSON SystemTime | {"seconds": SSS, "nanoseconds": NNN} .
|
Instance detailsDefined in Z.Data.JSON.Base |
JSON ExitCode | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON IntSet | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON TimeOfDay | HH:MM:SS.SSS |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CalendarDiffTime | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON DayOfWeek | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Day | YYYY-MM-DD |
Instance detailsDefined in Z.Data.JSON.Base |
JSON CalendarDiffDays | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON Tag Source # | |
Instance detailsDefined in Z.Data.YAML.FFI |
JSON Mark Source # | |
Instance detailsDefined in Z.Data.YAML.FFI |
JSON MarkedEvent Source # | |
Instance detailsDefined in Z.Data.YAML.FFI |
JSON Event Source # | |
Instance detailsDefined in Z.Data.YAML.FFI |
JSON [Char] | This is an INCOHERENT instance, to provide JSON text encoding behaviour. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON [a] | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Maybe a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, Integral a) => JSON (Ratio a) | This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Ratio and provide your own instance using withScientific if you want to allow larger inputs. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (FlatIntMap a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(Ord a, JSON a) => JSON (FlatSet a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Vector a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(Prim a, JSON a) => JSON (PrimVector a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Array a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (SmallArray a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(Prim a, JSON a) => JSON (PrimArray a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Min a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Max a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (First a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Last a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (WrappedMonoid a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Identity a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (First a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Last a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Dual a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (NonEmpty a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (IntMap a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Tree a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Seq a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(Ord a, JSON a) => JSON (Set a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(Eq a, Hashable a, JSON a) => JSON (HashSet a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, JSON b) => JSON (Either a b) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, JSON b) => JSON (a, b) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (FlatMap Text a) | default instance prefer later key |
Instance detailsDefined in Z.Data.JSON.Base |
(PrimUnlifted a, JSON a) => JSON (UnliftedArray a) | |
Instance detailsDefined in Z.Data.JSON.Base |
HasResolution a => JSON (Fixed a) | This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Fixed and provide your own instance using withScientific if you want to allow larger inputs. |
Instance detailsDefined in Z.Data.JSON.Base |
JSON (Proxy a) | Use Null as Proxy a |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Map Text a) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (HashMap Text a) | default instance prefer later key |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, JSON b, JSON c) => JSON (a, b, c) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON a => JSON (Const a b) | |
Instance detailsDefined in Z.Data.JSON.Base |
JSON b => JSON (Tagged a b) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, JSON b, JSON c, JSON d) => JSON (a, b, c, d) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON (f a), JSON (g a)) => JSON (Product f g a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON (f a), JSON (g a), JSON a) => JSON (Sum f g a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, JSON b, JSON c, JSON d, JSON e) => JSON (a, b, c, d, e) | |
Instance detailsDefined in Z.Data.JSON.Base Methods fromValue :: Value -> Converter (a, b, c, d, e) # toValue :: (a, b, c, d, e) -> Value # encodeJSON :: (a, b, c, d, e) -> Builder () # |
JSON (f (g a)) => JSON (Compose f g a) | |
Instance detailsDefined in Z.Data.JSON.Base |
(JSON a, JSON b, JSON c, JSON d, JSON e, JSON f) => JSON (a, b, c, d, e, f) | |
Instance detailsDefined in Z.Data.JSON.Base Methods fromValue :: Value -> Converter (a, b, c, d, e, f) # toValue :: (a, b, c, d, e, f) -> Value # encodeJSON :: (a, b, c, d, e, f) -> Builder () # |
(JSON a, JSON b, JSON c, JSON d, JSON e, JSON f, JSON g) => JSON (a, b, c, d, e, f, g) | |
Instance detailsDefined in Z.Data.JSON.Base Methods fromValue :: Value -> Converter (a, b, c, d, e, f, g) # toValue :: (a, b, c, d, e, f, g) -> Value # encodeJSON :: (a, b, c, d, e, f, g) -> Builder () # |