Skip to content
Snippets Groups Projects
base-exports.stdout-javascript-unknown-ghcjs 918 KiB
Newer Older
  hGetBufNonBlocking :: forall a. Handle -> GHC.Ptr.Ptr a -> GHC.Types.Int -> IO GHC.Types.Int
  hGetBufSome :: forall a. Handle -> GHC.Ptr.Ptr a -> GHC.Types.Int -> IO GHC.Types.Int
  hGetBuffering :: Handle -> IO BufferMode
  hGetChar :: Handle -> IO GHC.Types.Char
  hGetContents :: Handle -> IO GHC.Base.String
  hGetContents' :: Handle -> IO GHC.Base.String
  hGetEcho :: Handle -> IO GHC.Types.Bool
  hGetEncoding :: Handle -> IO (GHC.Maybe.Maybe TextEncoding)
  hGetLine :: Handle -> IO GHC.Base.String
  hGetPosn :: Handle -> IO HandlePosn
  hIsClosed :: Handle -> IO GHC.Types.Bool
  hIsEOF :: Handle -> IO GHC.Types.Bool
  hIsOpen :: Handle -> IO GHC.Types.Bool
  hIsReadable :: Handle -> IO GHC.Types.Bool
  hIsSeekable :: Handle -> IO GHC.Types.Bool
  hIsTerminalDevice :: Handle -> IO GHC.Types.Bool
  hIsWritable :: Handle -> IO GHC.Types.Bool
  hLookAhead :: Handle -> IO GHC.Types.Char
  hPrint :: forall a. GHC.Show.Show a => Handle -> a -> IO ()
  hPutBuf :: forall a. Handle -> GHC.Ptr.Ptr a -> GHC.Types.Int -> IO ()
  hPutBufNonBlocking :: forall a. Handle -> GHC.Ptr.Ptr a -> GHC.Types.Int -> IO GHC.Types.Int
  hPutChar :: Handle -> GHC.Types.Char -> IO ()
  hPutStr :: Handle -> GHC.Base.String -> IO ()
  hPutStrLn :: Handle -> GHC.Base.String -> IO ()
  hReady :: Handle -> IO GHC.Types.Bool
  hSeek :: Handle -> SeekMode -> GHC.Num.Integer.Integer -> IO ()
  hSetBinaryMode :: Handle -> GHC.Types.Bool -> IO ()
  hSetBuffering :: Handle -> BufferMode -> IO ()
  hSetEcho :: Handle -> GHC.Types.Bool -> IO ()
  hSetEncoding :: Handle -> TextEncoding -> IO ()
  hSetFileSize :: Handle -> GHC.Num.Integer.Integer -> IO ()
  hSetNewlineMode :: Handle -> NewlineMode -> IO ()
  hSetPosn :: HandlePosn -> IO ()
  hShow :: Handle -> IO GHC.Base.String
  hTell :: Handle -> IO GHC.Num.Integer.Integer
  hWaitForInput :: Handle -> GHC.Types.Int -> IO GHC.Types.Bool
  interact :: (GHC.Base.String -> GHC.Base.String) -> IO ()
  isEOF :: IO GHC.Types.Bool
  latin1 :: TextEncoding
  localeEncoding :: TextEncoding
  mkTextEncoding :: GHC.Base.String -> IO TextEncoding
  nativeNewline :: Newline
  nativeNewlineMode :: NewlineMode
  noNewlineTranslation :: NewlineMode
  openBinaryFile :: FilePath -> IOMode -> IO Handle
  openBinaryTempFile :: FilePath -> GHC.Base.String -> IO (FilePath, Handle)
  openBinaryTempFileWithDefaultPermissions :: FilePath -> GHC.Base.String -> IO (FilePath, Handle)
  openFile :: FilePath -> IOMode -> IO Handle
  openTempFile :: FilePath -> GHC.Base.String -> IO (FilePath, Handle)
  openTempFileWithDefaultPermissions :: FilePath -> GHC.Base.String -> IO (FilePath, Handle)
  print :: forall a. GHC.Show.Show a => a -> IO ()
  putChar :: GHC.Types.Char -> IO ()
  putStr :: GHC.Base.String -> IO ()
  putStrLn :: GHC.Base.String -> IO ()
  readFile :: FilePath -> IO GHC.Base.String
  readFile' :: FilePath -> IO GHC.Base.String
  readIO :: forall a. GHC.Read.Read a => GHC.Base.String -> IO a
  readLn :: forall a. GHC.Read.Read a => IO a
  stderr :: Handle
  stdin :: Handle
  stdout :: Handle
  universalNewlineMode :: NewlineMode
  utf16 :: TextEncoding
  utf16be :: TextEncoding
  utf16le :: TextEncoding
  utf32 :: TextEncoding
  utf32be :: TextEncoding
  utf32le :: TextEncoding
  utf8 :: TextEncoding
  utf8_bom :: TextEncoding
  withBinaryFile :: forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
  withFile :: forall r. FilePath -> IOMode -> (Handle -> IO r) -> IO r
  writeFile :: FilePath -> GHC.Base.String -> IO ()

module System.IO.Error where
  -- Safety: Trustworthy
  type IOError :: *
  type IOError = GHC.IO.Exception.IOException
  type IOErrorType :: *
  data IOErrorType = ...
  alreadyExistsErrorType :: IOErrorType
  alreadyInUseErrorType :: IOErrorType
  annotateIOError :: IOError -> GHC.Base.String -> GHC.Maybe.Maybe GHC.IO.Handle.Types.Handle -> GHC.Maybe.Maybe GHC.IO.FilePath -> IOError
  catchIOError :: forall a. GHC.Types.IO a -> (IOError -> GHC.Types.IO a) -> GHC.Types.IO a
  doesNotExistErrorType :: IOErrorType
  eofErrorType :: IOErrorType
  fullErrorType :: IOErrorType
  illegalOperationErrorType :: IOErrorType
  ioError :: forall a. IOError -> GHC.Types.IO a
  ioeGetErrorString :: IOError -> GHC.Base.String
  ioeGetErrorType :: IOError -> IOErrorType
  ioeGetFileName :: IOError -> GHC.Maybe.Maybe GHC.IO.FilePath
  ioeGetHandle :: IOError -> GHC.Maybe.Maybe GHC.IO.Handle.Types.Handle
  ioeGetLocation :: IOError -> GHC.Base.String
  ioeSetErrorString :: IOError -> GHC.Base.String -> IOError
  ioeSetErrorType :: IOError -> IOErrorType -> IOError
  ioeSetFileName :: IOError -> GHC.IO.FilePath -> IOError
  ioeSetHandle :: IOError -> GHC.IO.Handle.Types.Handle -> IOError
  ioeSetLocation :: IOError -> GHC.Base.String -> IOError
  isAlreadyExistsError :: IOError -> GHC.Types.Bool
  isAlreadyExistsErrorType :: IOErrorType -> GHC.Types.Bool
  isAlreadyInUseError :: IOError -> GHC.Types.Bool
  isAlreadyInUseErrorType :: IOErrorType -> GHC.Types.Bool
  isDoesNotExistError :: IOError -> GHC.Types.Bool
  isDoesNotExistErrorType :: IOErrorType -> GHC.Types.Bool
  isEOFError :: IOError -> GHC.Types.Bool
  isEOFErrorType :: IOErrorType -> GHC.Types.Bool
  isFullError :: IOError -> GHC.Types.Bool
  isFullErrorType :: IOErrorType -> GHC.Types.Bool
  isIllegalOperation :: IOError -> GHC.Types.Bool
  isIllegalOperationErrorType :: IOErrorType -> GHC.Types.Bool
  isPermissionError :: IOError -> GHC.Types.Bool
  isPermissionErrorType :: IOErrorType -> GHC.Types.Bool
  isResourceVanishedError :: IOError -> GHC.Types.Bool
  isResourceVanishedErrorType :: IOErrorType -> GHC.Types.Bool
  isUserError :: IOError -> GHC.Types.Bool
  isUserErrorType :: IOErrorType -> GHC.Types.Bool
  mkIOError :: IOErrorType -> GHC.Base.String -> GHC.Maybe.Maybe GHC.IO.Handle.Types.Handle -> GHC.Maybe.Maybe GHC.IO.FilePath -> IOError
  modifyIOError :: forall a. (IOError -> IOError) -> GHC.Types.IO a -> GHC.Types.IO a
  permissionErrorType :: IOErrorType
  resourceVanishedErrorType :: IOErrorType
  tryIOError :: forall a. GHC.Types.IO a -> GHC.Types.IO (Data.Either.Either IOError a)
  userError :: GHC.Base.String -> IOError
  userErrorType :: IOErrorType

module System.IO.Unsafe where
  -- Safety: Unsafe
  unsafeDupablePerformIO :: forall a. GHC.Types.IO a -> a
  unsafeFixIO :: forall a. (a -> GHC.Types.IO a) -> GHC.Types.IO a
  unsafeInterleaveIO :: forall a. GHC.Types.IO a -> GHC.Types.IO a
  unsafePerformIO :: forall a. GHC.Types.IO a -> a

module System.Info where
  -- Safety: Safe
  arch :: GHC.Base.String
  compilerName :: GHC.Base.String
  compilerVersion :: Data.Version.Version
  fullCompilerVersion :: Data.Version.Version
  os :: GHC.Base.String

module System.Mem where
  -- Safety: Trustworthy
  disableAllocationLimit :: GHC.Types.IO ()
  enableAllocationLimit :: GHC.Types.IO ()
  getAllocationCounter :: GHC.Types.IO GHC.Int.Int64
  performGC :: GHC.Types.IO ()
  performMajorGC :: GHC.Types.IO ()
  performMinorGC :: GHC.Types.IO ()
  setAllocationCounter :: GHC.Int.Int64 -> GHC.Types.IO ()

module System.Mem.StableName where
  -- Safety: Safe
  type role StableName phantom
  type StableName :: * -> *
  data StableName a = ...
  eqStableName :: forall a b. StableName a -> StableName b -> GHC.Types.Bool
  hashStableName :: forall a. StableName a -> GHC.Types.Int
  makeStableName :: forall a. a -> GHC.Types.IO (StableName a)

module System.Mem.Weak where
  -- Safety: Trustworthy
  type Weak :: * -> *
  data Weak v = ...
  addFinalizer :: forall key. key -> GHC.Types.IO () -> GHC.Types.IO ()
  deRefWeak :: forall v. Weak v -> GHC.Types.IO (GHC.Maybe.Maybe v)
  finalize :: forall v. Weak v -> GHC.Types.IO ()
  getFinalizerExceptionHandler :: GHC.Types.IO (GHC.Exception.Type.SomeException -> GHC.Types.IO ())
  mkWeak :: forall k v. k -> v -> GHC.Maybe.Maybe (GHC.Types.IO ()) -> GHC.Types.IO (Weak v)
  mkWeakPair :: forall k v. k -> v -> GHC.Maybe.Maybe (GHC.Types.IO ()) -> GHC.Types.IO (Weak (k, v))
  mkWeakPtr :: forall k. k -> GHC.Maybe.Maybe (GHC.Types.IO ()) -> GHC.Types.IO (Weak k)
  printToHandleFinalizerExceptionHandler :: GHC.IO.Handle.Types.Handle -> GHC.Exception.Type.SomeException -> GHC.Types.IO ()
  setFinalizerExceptionHandler :: (GHC.Exception.Type.SomeException -> GHC.Types.IO ()) -> GHC.Types.IO ()

module System.Posix.Internals where
  -- Safety: Trustworthy
  type CFLock :: *
  data CFLock
  type CFilePath :: *
  type CFilePath = ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString
  type CGroup :: *
  data CGroup
  type CLconv :: *
  data CLconv
  type CPasswd :: *
  data CPasswd
  type CSigaction :: *
  data CSigaction
  type CSigset :: *
  data CSigset
  type CStat :: *
  data CStat
  type CTermios :: *
  data CTermios
  type CTm :: *
  data CTm
  type CTms :: *
  data CTms
  type CUtimbuf :: *
  data CUtimbuf
  type CUtsname :: *
  data CUtsname
  type FD :: *
  type FD = Foreign.C.Types.CInt
  c_access :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_chmod :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_close :: Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_creat :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_dup :: Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_dup2 :: Foreign.C.Types.CInt -> Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_fcntl_lock :: Foreign.C.Types.CInt -> Foreign.C.Types.CInt -> GHC.Ptr.Ptr CFLock -> GHC.Types.IO Foreign.C.Types.CInt
  c_fcntl_read :: Foreign.C.Types.CInt -> Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_fcntl_write :: Foreign.C.Types.CInt -> Foreign.C.Types.CInt -> Foreign.C.Types.CLong -> GHC.Types.IO Foreign.C.Types.CInt
  c_fstat :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr CStat -> GHC.Types.IO Foreign.C.Types.CInt
  c_ftruncate :: Foreign.C.Types.CInt -> System.Posix.Types.FileOffset -> GHC.Types.IO Foreign.C.Types.CInt
  c_getpid :: GHC.Types.IO System.Posix.Types.CPid
  c_interruptible_open :: CFilePath -> Foreign.C.Types.CInt -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_interruptible_open_ :: CFilePath -> Foreign.C.Types.CInt -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_isatty :: Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_lflag :: GHC.Ptr.Ptr CTermios -> GHC.Types.IO System.Posix.Types.CTcflag
  c_link :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> GHC.Types.IO Foreign.C.Types.CInt
  c_lseek :: Foreign.C.Types.CInt -> System.Posix.Types.COff -> Foreign.C.Types.CInt -> GHC.Types.IO System.Posix.Types.COff
  c_mkfifo :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_open :: CFilePath -> Foreign.C.Types.CInt -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_pipe :: GHC.Ptr.Ptr Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_read :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr GHC.Word.Word8 -> Foreign.C.Types.CSize -> GHC.Types.IO System.Posix.Types.CSsize
  c_s_isblk :: System.Posix.Types.CMode -> Foreign.C.Types.CInt
  c_s_ischr :: System.Posix.Types.CMode -> Foreign.C.Types.CInt
  c_s_isdir :: System.Posix.Types.CMode -> Foreign.C.Types.CInt
  c_s_isfifo :: System.Posix.Types.CMode -> Foreign.C.Types.CInt
  c_s_isreg :: System.Posix.Types.CMode -> Foreign.C.Types.CInt
  c_s_issock :: System.Posix.Types.CMode -> Foreign.C.Types.CInt
  c_safe_open :: CFilePath -> Foreign.C.Types.CInt -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_safe_open_ :: CFilePath -> Foreign.C.Types.CInt -> System.Posix.Types.CMode -> GHC.Types.IO Foreign.C.Types.CInt
  c_safe_read :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr GHC.Word.Word8 -> Foreign.C.Types.CSize -> GHC.Types.IO System.Posix.Types.CSsize
  c_safe_write :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr GHC.Word.Word8 -> Foreign.C.Types.CSize -> GHC.Types.IO System.Posix.Types.CSsize
  c_sigaddset :: GHC.Ptr.Ptr CSigset -> Foreign.C.Types.CInt -> GHC.Types.IO Foreign.C.Types.CInt
  c_sigemptyset :: GHC.Ptr.Ptr CSigset -> GHC.Types.IO Foreign.C.Types.CInt
  c_sigprocmask :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr CSigset -> GHC.Ptr.Ptr CSigset -> GHC.Types.IO Foreign.C.Types.CInt
  c_stat :: CFilePath -> GHC.Ptr.Ptr CStat -> GHC.Types.IO Foreign.C.Types.CInt
  c_tcgetattr :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr CTermios -> GHC.Types.IO Foreign.C.Types.CInt
  c_tcsetattr :: Foreign.C.Types.CInt -> Foreign.C.Types.CInt -> GHC.Ptr.Ptr CTermios -> GHC.Types.IO Foreign.C.Types.CInt
  c_umask :: System.Posix.Types.CMode -> GHC.Types.IO System.Posix.Types.CMode
  c_unlink :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> GHC.Types.IO Foreign.C.Types.CInt
  c_utime :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> GHC.Ptr.Ptr CUtimbuf -> GHC.Types.IO Foreign.C.Types.CInt
  c_waitpid :: System.Posix.Types.CPid -> GHC.Ptr.Ptr Foreign.C.Types.CInt -> Foreign.C.Types.CInt -> GHC.Types.IO System.Posix.Types.CPid
  c_write :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr GHC.Word.Word8 -> Foreign.C.Types.CSize -> GHC.Types.IO System.Posix.Types.CSsize
  checkForInteriorNuls :: GHC.IO.FilePath -> ghc-internal-0.1.0.0:GHC.Foreign.Internal.CStringLen -> GHC.Types.IO ()
  const_echo :: Foreign.C.Types.CInt
  const_f_getfl :: Foreign.C.Types.CInt
  const_f_setfd :: Foreign.C.Types.CInt
  const_f_setfl :: Foreign.C.Types.CInt
  const_fd_cloexec :: Foreign.C.Types.CLong
  const_icanon :: Foreign.C.Types.CInt
  const_sig_block :: Foreign.C.Types.CInt
  const_sig_setmask :: Foreign.C.Types.CInt
  const_sigttou :: Foreign.C.Types.CInt
  const_tcsanow :: Foreign.C.Types.CInt
  const_vmin :: Foreign.C.Types.CInt
  const_vtime :: Foreign.C.Types.CInt
  dEFAULT_BUFFER_SIZE :: GHC.Types.Int
  fdFileSize :: FD -> GHC.Types.IO GHC.Num.Integer.Integer
  fdGetMode :: FD -> GHC.Types.IO GHC.IO.IOMode.IOMode
  fdStat :: FD -> GHC.Types.IO (GHC.IO.Device.IODeviceType, System.Posix.Types.CDev, System.Posix.Types.CIno)
  fdType :: FD -> GHC.Types.IO GHC.IO.Device.IODeviceType
  fileType :: GHC.IO.FilePath -> GHC.Types.IO GHC.IO.Device.IODeviceType
  getEcho :: FD -> GHC.Types.IO GHC.Types.Bool
  get_saved_termios :: Foreign.C.Types.CInt -> GHC.Types.IO (GHC.Ptr.Ptr CTermios)
  hostIsThreaded :: GHC.Types.Bool
  ioe_unknownfiletype :: GHC.IO.Exception.IOException
  lstat :: CFilePath -> GHC.Ptr.Ptr CStat -> GHC.Types.IO Foreign.C.Types.CInt
  newFilePath :: GHC.IO.FilePath -> GHC.Types.IO ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString
  o_APPEND :: Foreign.C.Types.CInt
  o_BINARY :: Foreign.C.Types.CInt
  o_CREAT :: Foreign.C.Types.CInt
  o_EXCL :: Foreign.C.Types.CInt
  o_NOCTTY :: Foreign.C.Types.CInt
  o_NONBLOCK :: Foreign.C.Types.CInt
  o_RDONLY :: Foreign.C.Types.CInt
  o_RDWR :: Foreign.C.Types.CInt
  o_TRUNC :: Foreign.C.Types.CInt
  o_WRONLY :: Foreign.C.Types.CInt
  peekFilePath :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> GHC.Types.IO GHC.IO.FilePath
  peekFilePathLen :: ghc-internal-0.1.0.0:GHC.Foreign.Internal.CStringLen -> GHC.Types.IO GHC.IO.FilePath
  poke_c_lflag :: GHC.Ptr.Ptr CTermios -> System.Posix.Types.CTcflag -> GHC.Types.IO ()
  ptr_c_cc :: GHC.Ptr.Ptr CTermios -> GHC.Types.IO (GHC.Ptr.Ptr GHC.Word.Word8)
  puts :: GHC.Base.String -> GHC.Types.IO ()
  rtsIsThreaded_ :: GHC.Types.Int
  sEEK_CUR :: Foreign.C.Types.CInt
  sEEK_END :: Foreign.C.Types.CInt
  sEEK_SET :: Foreign.C.Types.CInt
  s_isblk :: System.Posix.Types.CMode -> GHC.Types.Bool
  s_ischr :: System.Posix.Types.CMode -> GHC.Types.Bool
  s_isdir :: System.Posix.Types.CMode -> GHC.Types.Bool
  s_isfifo :: System.Posix.Types.CMode -> GHC.Types.Bool
  s_isreg :: System.Posix.Types.CMode -> GHC.Types.Bool
  s_issock :: System.Posix.Types.CMode -> GHC.Types.Bool
  setCloseOnExec :: FD -> GHC.Types.IO ()
  setCooked :: FD -> GHC.Types.Bool -> GHC.Types.IO ()
  setEcho :: FD -> GHC.Types.Bool -> GHC.Types.IO ()
  setNonBlockingFD :: FD -> GHC.Types.Bool -> GHC.Types.IO ()
  set_saved_termios :: Foreign.C.Types.CInt -> GHC.Ptr.Ptr CTermios -> GHC.Types.IO ()
  sizeof_sigset_t :: GHC.Types.Int
  sizeof_stat :: GHC.Types.Int
  sizeof_termios :: GHC.Types.Int
  st_dev :: GHC.Ptr.Ptr CStat -> GHC.Types.IO System.Posix.Types.CDev
  st_ino :: GHC.Ptr.Ptr CStat -> GHC.Types.IO System.Posix.Types.CIno
  st_mode :: GHC.Ptr.Ptr CStat -> GHC.Types.IO System.Posix.Types.CMode
  st_mtime :: GHC.Ptr.Ptr CStat -> GHC.Types.IO Foreign.C.Types.CTime
  st_size :: GHC.Ptr.Ptr CStat -> GHC.Types.IO GHC.Int.Int64
  statGetType :: GHC.Ptr.Ptr CStat -> GHC.Types.IO GHC.IO.Device.IODeviceType
  tcSetAttr :: forall a. FD -> (GHC.Ptr.Ptr CTermios -> GHC.Types.IO a) -> GHC.Types.IO a
  throwInternalNulError :: forall a. GHC.IO.FilePath -> GHC.Types.IO a
  withFilePath :: forall a. GHC.IO.FilePath -> (ghc-internal-0.1.0.0:GHC.Foreign.Internal.CString -> GHC.Types.IO a) -> GHC.Types.IO a

module System.Posix.Types where

-- ignored


module System.Timeout where
  -- Safety: Safe
  type Timeout :: *
  newtype Timeout = ...
  timeout :: forall a. GHC.Types.Int -> GHC.Types.IO a -> GHC.Types.IO (GHC.Maybe.Maybe a)

module Text.ParserCombinators.ReadP where
  -- Safety: Trustworthy
  (+++) :: forall a. ReadP a -> ReadP a -> ReadP a
  (<++) :: forall a. ReadP a -> ReadP a -> ReadP a
  type ReadP :: * -> *
  newtype ReadP a = ...
  type ReadS :: * -> *
  type ReadS a = GHC.Base.String -> [(a, GHC.Base.String)]
  between :: forall open close a. ReadP open -> ReadP close -> ReadP a -> ReadP a
  chainl :: forall a. ReadP a -> ReadP (a -> a -> a) -> a -> ReadP a
  chainl1 :: forall a. ReadP a -> ReadP (a -> a -> a) -> ReadP a
  chainr :: forall a. ReadP a -> ReadP (a -> a -> a) -> a -> ReadP a
  chainr1 :: forall a. ReadP a -> ReadP (a -> a -> a) -> ReadP a
  char :: GHC.Types.Char -> ReadP GHC.Types.Char
  choice :: forall a. [ReadP a] -> ReadP a
  count :: forall a. GHC.Types.Int -> ReadP a -> ReadP [a]
  endBy :: forall a sep. ReadP a -> ReadP sep -> ReadP [a]
  endBy1 :: forall a sep. ReadP a -> ReadP sep -> ReadP [a]
  eof :: ReadP ()
  gather :: forall a. ReadP a -> ReadP (GHC.Base.String, a)
  get :: ReadP GHC.Types.Char
  look :: ReadP GHC.Base.String
  many :: forall a. ReadP a -> ReadP [a]
  many1 :: forall a. ReadP a -> ReadP [a]
  manyTill :: forall a end. ReadP a -> ReadP end -> ReadP [a]
  munch :: (GHC.Types.Char -> GHC.Types.Bool) -> ReadP GHC.Base.String
  munch1 :: (GHC.Types.Char -> GHC.Types.Bool) -> ReadP GHC.Base.String
  option :: forall a. a -> ReadP a -> ReadP a
  optional :: forall a. ReadP a -> ReadP ()
  pfail :: forall a. ReadP a
  readP_to_S :: forall a. ReadP a -> ReadS a
  readS_to_P :: forall a. ReadS a -> ReadP a
  satisfy :: (GHC.Types.Char -> GHC.Types.Bool) -> ReadP GHC.Types.Char
  sepBy :: forall a sep. ReadP a -> ReadP sep -> ReadP [a]
  sepBy1 :: forall a sep. ReadP a -> ReadP sep -> ReadP [a]
  skipMany :: forall a. ReadP a -> ReadP ()
  skipMany1 :: forall a. ReadP a -> ReadP ()
  skipSpaces :: ReadP ()
  string :: GHC.Base.String -> ReadP GHC.Base.String

module Text.ParserCombinators.ReadPrec where
  -- Safety: Trustworthy
  (+++) :: forall a. ReadPrec a -> ReadPrec a -> ReadPrec a
  (<++) :: forall a. ReadPrec a -> ReadPrec a -> ReadPrec a
  type Prec :: *
  type Prec = GHC.Types.Int
  type ReadPrec :: * -> *
  newtype ReadPrec a = ...
  choice :: forall a. [ReadPrec a] -> ReadPrec a
  get :: ReadPrec GHC.Types.Char
  lift :: forall a. Text.ParserCombinators.ReadP.ReadP a -> ReadPrec a
  look :: ReadPrec GHC.Base.String
  minPrec :: Prec
  pfail :: forall a. ReadPrec a
  prec :: forall a. Prec -> ReadPrec a -> ReadPrec a
  readP_to_Prec :: forall a. (GHC.Types.Int -> Text.ParserCombinators.ReadP.ReadP a) -> ReadPrec a
  readPrec_to_P :: forall a. ReadPrec a -> GHC.Types.Int -> Text.ParserCombinators.ReadP.ReadP a
  readPrec_to_S :: forall a. ReadPrec a -> GHC.Types.Int -> Text.ParserCombinators.ReadP.ReadS a
  readS_to_Prec :: forall a. (GHC.Types.Int -> Text.ParserCombinators.ReadP.ReadS a) -> ReadPrec a
  reset :: forall a. ReadPrec a -> ReadPrec a
  step :: forall a. ReadPrec a -> ReadPrec a

module Text.Printf where
  -- Safety: Safe
  type FieldFormat :: *
  data FieldFormat = FieldFormat {fmtWidth :: GHC.Maybe.Maybe GHC.Types.Int, fmtPrecision :: GHC.Maybe.Maybe GHC.Types.Int, fmtAdjust :: GHC.Maybe.Maybe FormatAdjustment, fmtSign :: GHC.Maybe.Maybe FormatSign, fmtAlternate :: GHC.Types.Bool, fmtModifiers :: GHC.Base.String, fmtChar :: GHC.Types.Char}
  type FieldFormatter :: *
  type FieldFormatter = FieldFormat -> GHC.Show.ShowS
  type FormatAdjustment :: *
  data FormatAdjustment = LeftAdjust | ZeroPad
  type FormatParse :: *
  data FormatParse = FormatParse {fpModifiers :: GHC.Base.String, fpChar :: GHC.Types.Char, fpRest :: GHC.Base.String}
  type FormatSign :: *
  data FormatSign = SignPlus | SignSpace
  type HPrintfType :: * -> Constraint
  class HPrintfType t where
    ...
    {-# MINIMAL Text.Printf.hspr #-}
  type IsChar :: * -> Constraint
  class IsChar c where
    toChar :: c -> GHC.Types.Char
    fromChar :: GHC.Types.Char -> c
    {-# MINIMAL toChar, fromChar #-}
  type ModifierParser :: *
  type ModifierParser = GHC.Base.String -> FormatParse
  type PrintfArg :: * -> Constraint
  class PrintfArg a where
    formatArg :: a -> FieldFormatter
    parseFormat :: a -> ModifierParser
    {-# MINIMAL formatArg #-}
  type PrintfType :: * -> Constraint
  class PrintfType t where
    ...
    {-# MINIMAL Text.Printf.spr #-}
  errorBadArgument :: forall a. a
  errorBadFormat :: forall a. GHC.Types.Char -> a
  errorMissingArgument :: forall a. a
  errorShortFormat :: forall a. a
  formatChar :: GHC.Types.Char -> FieldFormatter
  formatInt :: forall a. (GHC.Real.Integral a, GHC.Enum.Bounded a) => a -> FieldFormatter
  formatInteger :: GHC.Num.Integer.Integer -> FieldFormatter
  formatRealFloat :: forall a. GHC.Float.RealFloat a => a -> FieldFormatter
  formatString :: forall a. IsChar a => [a] -> FieldFormatter
  hPrintf :: forall r. HPrintfType r => GHC.IO.Handle.Types.Handle -> GHC.Base.String -> r
  perror :: forall a. GHC.Base.String -> a
  printf :: forall r. PrintfType r => GHC.Base.String -> r
  vFmt :: GHC.Types.Char -> FieldFormat -> FieldFormat

module Text.Read where
  -- Safety: Trustworthy
  (+++) :: forall a. ReadPrec a -> ReadPrec a -> ReadPrec a
  (<++) :: forall a. ReadPrec a -> ReadPrec a -> ReadPrec a
  type Lexeme :: *
  data Lexeme = Char GHC.Types.Char | String GHC.Base.String | Punc GHC.Base.String | Ident GHC.Base.String | Symbol GHC.Base.String | Number Text.Read.Lex.Number | EOF
  type Prec :: *
  type Prec = GHC.Types.Int
  type Read :: * -> Constraint
  class Read a where
    readsPrec :: GHC.Types.Int -> ReadS a
    readList :: ReadS [a]
    readPrec :: ReadPrec a
    readListPrec :: ReadPrec [a]
    {-# MINIMAL readsPrec | readPrec #-}
  type ReadPrec :: * -> *
  newtype ReadPrec a = ...
  type ReadS :: * -> *
  type ReadS a = GHC.Base.String -> [(a, GHC.Base.String)]
  choice :: forall a. [ReadPrec a] -> ReadPrec a
  get :: ReadPrec GHC.Types.Char
  lex :: ReadS GHC.Base.String
  lexP :: ReadPrec Lexeme
  lift :: forall a. Text.ParserCombinators.ReadP.ReadP a -> ReadPrec a
  look :: ReadPrec GHC.Base.String
  minPrec :: Prec
  parens :: forall a. ReadPrec a -> ReadPrec a
  pfail :: forall a. ReadPrec a
  prec :: forall a. Prec -> ReadPrec a -> ReadPrec a
  read :: forall a. Read a => GHC.Base.String -> a
  readEither :: forall a. Read a => GHC.Base.String -> Data.Either.Either GHC.Base.String a
  readListDefault :: forall a. Read a => ReadS [a]
  readListPrecDefault :: forall a. Read a => ReadPrec [a]
  readMaybe :: forall a. Read a => GHC.Base.String -> GHC.Maybe.Maybe a
  readP_to_Prec :: forall a. (GHC.Types.Int -> Text.ParserCombinators.ReadP.ReadP a) -> ReadPrec a
  readParen :: forall a. GHC.Types.Bool -> ReadS a -> ReadS a
  readPrec_to_P :: forall a. ReadPrec a -> GHC.Types.Int -> Text.ParserCombinators.ReadP.ReadP a
  readPrec_to_S :: forall a. ReadPrec a -> GHC.Types.Int -> ReadS a
  readS_to_Prec :: forall a. (GHC.Types.Int -> ReadS a) -> ReadPrec a
  reads :: forall a. Read a => ReadS a
  reset :: forall a. ReadPrec a -> ReadPrec a
  step :: forall a. ReadPrec a -> ReadPrec a

module Text.Read.Lex where
  -- Safety: Trustworthy
  type Lexeme :: *
  data Lexeme = Char GHC.Types.Char | String GHC.Base.String | Punc GHC.Base.String | Ident GHC.Base.String | Symbol GHC.Base.String | Number Number | EOF
  type Number :: *
  data Number = ...
  expect :: Lexeme -> Text.ParserCombinators.ReadP.ReadP ()
  hsLex :: Text.ParserCombinators.ReadP.ReadP GHC.Base.String
  isSymbolChar :: GHC.Types.Char -> GHC.Types.Bool
  lex :: Text.ParserCombinators.ReadP.ReadP Lexeme
  lexChar :: Text.ParserCombinators.ReadP.ReadP GHC.Types.Char
  numberToFixed :: GHC.Num.Integer.Integer -> Number -> GHC.Maybe.Maybe (GHC.Num.Integer.Integer, GHC.Num.Integer.Integer)
  numberToInteger :: Number -> GHC.Maybe.Maybe GHC.Num.Integer.Integer
  numberToRangedRational :: (GHC.Types.Int, GHC.Types.Int) -> Number -> GHC.Maybe.Maybe GHC.Real.Rational
  numberToRational :: Number -> GHC.Real.Rational
  readBinP :: forall a. (GHC.Classes.Eq a, GHC.Num.Num a) => Text.ParserCombinators.ReadP.ReadP a
  readDecP :: forall a. (GHC.Classes.Eq a, GHC.Num.Num a) => Text.ParserCombinators.ReadP.ReadP a
  readHexP :: forall a. (GHC.Classes.Eq a, GHC.Num.Num a) => Text.ParserCombinators.ReadP.ReadP a
  readIntP :: forall a. GHC.Num.Num a => a -> (GHC.Types.Char -> GHC.Types.Bool) -> (GHC.Types.Char -> GHC.Types.Int) -> Text.ParserCombinators.ReadP.ReadP a
  readOctP :: forall a. (GHC.Classes.Eq a, GHC.Num.Num a) => Text.ParserCombinators.ReadP.ReadP a

module Text.Show where
  -- Safety: Safe
  type Show :: * -> Constraint
  class Show a where
    showsPrec :: GHC.Types.Int -> a -> ShowS
    show :: a -> GHC.Base.String
    showList :: [a] -> ShowS
    {-# MINIMAL showsPrec | show #-}
  type ShowS :: *
  type ShowS = GHC.Base.String -> GHC.Base.String
  showChar :: GHC.Types.Char -> ShowS
  showListWith :: forall a. (a -> ShowS) -> [a] -> ShowS
  showParen :: GHC.Types.Bool -> ShowS -> ShowS
  showString :: GHC.Base.String -> ShowS
  shows :: forall a. Show a => a -> ShowS

module Text.Show.Functions where
  -- Safety: Safe

module Type.Reflection where
  -- Safety: Safe-Inferred
  type role (:~:) nominal nominal
  type (:~:) :: forall {k}. k -> k -> *
  data (:~:) a b where
    Refl :: forall {k} (a :: k). (:~:) a a
  type role (:~~:) nominal nominal
  type (:~~:) :: forall k1 k2. k1 -> k2 -> *
  data (:~~:) a b where
    HRefl :: forall {k1} (a :: k1). (:~~:) a a
  pattern App :: forall k2 (t :: k2). () => forall k1 (a :: k1 -> k2) (b :: k1). (t ~ a b) => TypeRep a -> TypeRep b -> TypeRep t
  pattern Con :: forall k (a :: k). () => ghc-internal-0.1.0.0:Data.Typeable.Internal.NotApplication a => TyCon -> TypeRep a
  pattern Con' :: forall k (a :: k). () => ghc-internal-0.1.0.0:Data.Typeable.Internal.NotApplication a => TyCon -> [SomeTypeRep] -> TypeRep a
  pattern Fun :: forall k (fun :: k). () => forall (r1 :: GHC.Types.RuntimeRep) (r2 :: GHC.Types.RuntimeRep) (arg :: TYPE r1) (res :: TYPE r2). (k ~ *, fun ~~ (arg -> res)) => TypeRep arg -> TypeRep res -> TypeRep fun
  type Module :: *
  data Module = ...
  type SomeTypeRep :: *
  data SomeTypeRep where
    SomeTypeRep :: forall k (a :: k). !(TypeRep a) -> SomeTypeRep
  type TyCon :: *
  data TyCon = ...
  pattern TypeRep :: forall {k} (a :: k). () => Typeable a => TypeRep a
  type role TypeRep nominal
  type TypeRep :: forall k. k -> *
  data TypeRep a where
    ...
  type Typeable :: forall k. k -> Constraint
  class Typeable a where
    ...
    {-# MINIMAL ghc-internal-0.1.0.0:Data.Typeable.Internal.typeRep# #-}
  decTypeRep :: forall k1 k2 (a :: k1) (b :: k2). TypeRep a -> TypeRep b -> Data.Either.Either ((a :~~: b) -> GHC.Base.Void) (a :~~: b)
  eqTypeRep :: forall k1 k2 (a :: k1) (b :: k2). TypeRep a -> TypeRep b -> GHC.Maybe.Maybe (a :~~: b)
  moduleName :: Module -> GHC.Base.String
  modulePackage :: Module -> GHC.Base.String
  rnfModule :: Module -> ()
  rnfSomeTypeRep :: SomeTypeRep -> ()
  rnfTyCon :: TyCon -> ()
  rnfTypeRep :: forall {k} (a :: k). TypeRep a -> ()
  someTypeRep :: forall {k} (proxy :: k -> *) (a :: k). Typeable a => proxy a -> SomeTypeRep
  someTypeRepTyCon :: SomeTypeRep -> TyCon
  splitApps :: forall {k} (a :: k). TypeRep a -> (TyCon, [SomeTypeRep])
  tyConModule :: TyCon -> GHC.Base.String
  tyConName :: TyCon -> GHC.Base.String
  tyConPackage :: TyCon -> GHC.Base.String
  typeOf :: forall a. Typeable a => a -> TypeRep a
  typeRep :: forall {k} (a :: k). Typeable a => TypeRep a
  typeRepKind :: forall k (a :: k). TypeRep a -> TypeRep k
  typeRepTyCon :: forall {k} (a :: k). TypeRep a -> TyCon
  withTypeable :: forall k (a :: k) (rep :: GHC.Types.RuntimeRep) (r :: TYPE rep). TypeRep a -> (Typeable a => r) -> r

module Type.Reflection.Unsafe where
  -- Safety: Unsafe
  type KindRep :: *
  data KindRep = KindRepTyConApp TyCon [KindRep] | KindRepVar {-# UNPACK #-}GHC.Types.KindBndr | KindRepApp KindRep KindRep | KindRepFun KindRep KindRep | KindRepTYPE !GHC.Types.RuntimeRep | KindRepTypeLitS TypeLitSort GHC.Prim.Addr# | KindRepTypeLitD TypeLitSort [GHC.Types.Char]
  pattern KindRepTypeLit :: TypeLitSort -> GHC.Base.String -> KindRep
  type TyCon :: *
  data TyCon = ...
  type TypeLitSort :: *
  data TypeLitSort = TypeLitSymbol | TypeLitNat | TypeLitChar
  type role TypeRep nominal
  type TypeRep :: forall k. k -> *
  data TypeRep a where
    ...
  mkTrApp :: forall k1 k2 (a :: k1 -> k2) (b :: k1). TypeRep a -> TypeRep b -> TypeRep (a b)
  mkTrCon :: forall k (a :: k). TyCon -> [ghc-internal-0.1.0.0:Data.Typeable.Internal.SomeTypeRep] -> TypeRep a
  mkTyCon :: GHC.Base.String -> GHC.Base.String -> GHC.Base.String -> GHC.Types.Int -> KindRep -> TyCon
  someTypeRepFingerprint :: ghc-internal-0.1.0.0:Data.Typeable.Internal.SomeTypeRep -> GHC.Fingerprint.Type.Fingerprint
  tyConFingerprint :: TyCon -> GHC.Fingerprint.Type.Fingerprint
  tyConKindArgs :: TyCon -> GHC.Types.Int
  tyConKindRep :: TyCon -> KindRep
  typeRepFingerprint :: forall {k} (a :: k). TypeRep a -> GHC.Fingerprint.Type.Fingerprint

module Unsafe.Coerce where
  -- Safety: Unsafe
  type role UnsafeEquality nominal nominal
  type UnsafeEquality :: forall {k}. k -> k -> *
  data UnsafeEquality a b where
    UnsafeRefl :: forall {k} (a :: k). UnsafeEquality a a
  unsafeCoerce :: forall a b. a -> b
  unsafeCoerce# :: forall (q :: GHC.Types.RuntimeRep) (r :: GHC.Types.RuntimeRep) (a :: TYPE q) (b :: TYPE r). a -> b
  unsafeCoerceAddr :: forall (a :: TYPE GHC.Types.AddrRep) (b :: TYPE GHC.Types.AddrRep). a -> b
  unsafeCoerceUnlifted :: forall (a :: GHC.Types.UnliftedType) (b :: GHC.Types.UnliftedType). a -> b
  unsafeEqualityProof :: forall {k} (a :: k) (b :: k). UnsafeEquality a b


-- Instances:
instance [safe] Control.Monad.IO.Class.MonadIO GHC.Types.IO -- Defined in ‘Control.Monad.IO.Class’
instance [safe] Control.Monad.Zip.MonadZip Data.Ord.Down -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Data.Semigroup.Internal.Dual -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Data.Monoid.First -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Data.Functor.Identity.Identity -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Data.Monoid.Last -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip [] -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip GHC.Maybe.Maybe -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip GHC.Base.NonEmpty -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip GHC.Generics.Par1 -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Data.Semigroup.Internal.Product -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Solo -- Defined in ‘Control.Monad.Zip’
instance [safe] Control.Monad.Zip.MonadZip Data.Semigroup.Internal.Sum -- Defined in ‘Control.Monad.Zip’
instance Control.Monad.Zip.MonadZip Data.Complex.Complex -- Defined in ‘Data.Complex’
instance [safe] Data.Bifoldable.Bifoldable Data.Either.Either -- Defined in ‘Data.Bifoldable’
instance [safe] Data.Bifoldable.Bifoldable (,) -- Defined in ‘Data.Bifoldable’
instance [safe] forall x. Data.Bifoldable.Bifoldable ((,,) x) -- Defined in ‘Data.Bifoldable’
instance [safe] forall x y. Data.Bifoldable.Bifoldable ((,,,) x y) -- Defined in ‘Data.Bifoldable’
instance [safe] forall x y z. Data.Bifoldable.Bifoldable ((,,,,) x y z) -- Defined in ‘Data.Bifoldable’
instance [safe] forall x y z w. Data.Bifoldable.Bifoldable ((,,,,,) x y z w) -- Defined in ‘Data.Bifoldable’
instance [safe] forall x y z w v. Data.Bifoldable.Bifoldable ((,,,,,,) x y z w v) -- Defined in ‘Data.Bifoldable’
instance Data.Bifoldable.Bifoldable Data.Semigroup.Arg -- Defined in ‘Data.Semigroup’
instance [safe] Data.Bifoldable1.Bifoldable1 Data.Semigroup.Arg -- Defined in ‘Data.Bifoldable1’
instance [safe] Data.Bifoldable1.Bifoldable1 Data.Either.Either -- Defined in ‘Data.Bifoldable1’
instance [safe] Data.Bifoldable1.Bifoldable1 (,) -- Defined in ‘Data.Bifoldable1’
instance [safe] forall x. Data.Bifoldable1.Bifoldable1 ((,,) x) -- Defined in ‘Data.Bifoldable1’
instance [safe] forall x y. Data.Bifoldable1.Bifoldable1 ((,,,) x y) -- Defined in ‘Data.Bifoldable1’
instance [safe] forall x y z. Data.Bifoldable1.Bifoldable1 ((,,,,) x y z) -- Defined in ‘Data.Bifoldable1’
instance [safe] Data.Bifunctor.Bifunctor Data.Either.Either -- Defined in ‘Data.Bifunctor’
instance [safe] Data.Bifunctor.Bifunctor (,) -- Defined in ‘Data.Bifunctor’
instance [safe] forall x1. Data.Bifunctor.Bifunctor ((,,) x1) -- Defined in ‘Data.Bifunctor’
instance [safe] forall x1 x2. Data.Bifunctor.Bifunctor ((,,,) x1 x2) -- Defined in ‘Data.Bifunctor’
instance [safe] forall x1 x2 x3. Data.Bifunctor.Bifunctor ((,,,,) x1 x2 x3) -- Defined in ‘Data.Bifunctor’
instance [safe] forall x1 x2 x3 x4. Data.Bifunctor.Bifunctor ((,,,,,) x1 x2 x3 x4) -- Defined in ‘Data.Bifunctor’
instance [safe] forall x1 x2 x3 x4 x5. Data.Bifunctor.Bifunctor ((,,,,,,) x1 x2 x3 x4 x5) -- Defined in ‘Data.Bifunctor’
instance Data.Bifunctor.Bifunctor Data.Semigroup.Arg -- Defined in ‘Data.Semigroup’
instance Data.Bitraversable.Bitraversable Data.Either.Either -- Defined in ‘Data.Bitraversable’
instance Data.Bitraversable.Bitraversable (,) -- Defined in ‘Data.Bitraversable’
instance forall x. Data.Bitraversable.Bitraversable ((,,) x) -- Defined in ‘Data.Bitraversable’
instance forall x y. Data.Bitraversable.Bitraversable ((,,,) x y) -- Defined in ‘Data.Bitraversable’
instance forall x y z. Data.Bitraversable.Bitraversable ((,,,,) x y z) -- Defined in ‘Data.Bitraversable’
instance forall x y z w. Data.Bitraversable.Bitraversable ((,,,,,) x y z w) -- Defined in ‘Data.Bitraversable’
instance forall x y z w v. Data.Bitraversable.Bitraversable ((,,,,,,) x y z w v) -- Defined in ‘Data.Bitraversable’
instance Data.Bitraversable.Bitraversable Data.Semigroup.Arg -- Defined in ‘Data.Semigroup’
instance forall (n :: GHC.TypeNats.Nat). GHC.TypeNats.KnownNat n => Data.Fixed.HasResolution n -- Defined in ‘Data.Fixed’
instance Data.Foldable1.Foldable1 Data.Complex.Complex -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Ord.Down -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.Internal.Dual -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.First -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Functor.Identity.Identity -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.Last -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.Max -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.Min -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 GHC.Base.NonEmpty -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 GHC.Generics.Par1 -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.Internal.Product -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Solo -- Defined in ‘Data.Foldable1’
instance Data.Foldable1.Foldable1 Data.Semigroup.Internal.Sum -- Defined in ‘Data.Foldable1’
instance forall a. Data.Foldable1.Foldable1 ((,) a) -- Defined in ‘Data.Foldable1’
instance [safe] Data.Functor.Classes.Eq1 Data.Complex.Complex -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq1 Data.Ord.Down -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Classes.Eq a => Data.Functor.Classes.Eq1 (Data.Either.Either a) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq1 Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq1 [] -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq1 GHC.Maybe.Maybe -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq1 GHC.Base.NonEmpty -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq1 Solo -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Classes.Eq a => Data.Functor.Classes.Eq1 ((,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Classes.Eq a, GHC.Classes.Eq b) => Data.Functor.Classes.Eq1 ((,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b c. (GHC.Classes.Eq a, GHC.Classes.Eq b, GHC.Classes.Eq c) => Data.Functor.Classes.Eq1 ((,,,) a b c) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq2 Data.Either.Either -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Eq2 (,) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Classes.Eq a => Data.Functor.Classes.Eq2 ((,,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Classes.Eq a, GHC.Classes.Eq b) => Data.Functor.Classes.Eq2 ((,,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord1 Data.Ord.Down -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Classes.Ord a => Data.Functor.Classes.Ord1 (Data.Either.Either a) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord1 Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord1 [] -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord1 GHC.Maybe.Maybe -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord1 GHC.Base.NonEmpty -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord1 Solo -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Classes.Ord a => Data.Functor.Classes.Ord1 ((,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Classes.Ord a, GHC.Classes.Ord b) => Data.Functor.Classes.Ord1 ((,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b c. (GHC.Classes.Ord a, GHC.Classes.Ord b, GHC.Classes.Ord c) => Data.Functor.Classes.Ord1 ((,,,) a b c) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord2 Data.Either.Either -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Ord2 (,) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Classes.Ord a => Data.Functor.Classes.Ord2 ((,,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Classes.Ord a, GHC.Classes.Ord b) => Data.Functor.Classes.Ord2 ((,,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 Data.Complex.Complex -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 Data.Ord.Down -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Read.Read a => Data.Functor.Classes.Read1 (Data.Either.Either a) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 [] -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 GHC.Maybe.Maybe -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 GHC.Base.NonEmpty -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read1 Solo -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Read.Read a => Data.Functor.Classes.Read1 ((,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Read.Read a, GHC.Read.Read b) => Data.Functor.Classes.Read1 ((,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b c. (GHC.Read.Read a, GHC.Read.Read b, GHC.Read.Read c) => Data.Functor.Classes.Read1 ((,,,) a b c) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read2 Data.Either.Either -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Read2 (,) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Read.Read a => Data.Functor.Classes.Read2 ((,,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Read.Read a, GHC.Read.Read b) => Data.Functor.Classes.Read2 ((,,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 Data.Complex.Complex -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 Data.Ord.Down -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Show.Show a => Data.Functor.Classes.Show1 (Data.Either.Either a) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 [] -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 GHC.Maybe.Maybe -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 GHC.Base.NonEmpty -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show1 Solo -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Show.Show a => Data.Functor.Classes.Show1 ((,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Show.Show a, GHC.Show.Show b) => Data.Functor.Classes.Show1 ((,,) a b) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b c. (GHC.Show.Show a, GHC.Show.Show b, GHC.Show.Show c) => Data.Functor.Classes.Show1 ((,,,) a b c) -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show2 Data.Either.Either -- Defined in ‘Data.Functor.Classes’
instance [safe] Data.Functor.Classes.Show2 (,) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a. GHC.Show.Show a => Data.Functor.Classes.Show2 ((,,) a) -- Defined in ‘Data.Functor.Classes’
instance [safe] forall a b. (GHC.Show.Show a, GHC.Show.Show b) => Data.Functor.Classes.Show2 ((,,,) a b) -- Defined in ‘Data.Functor.Classes’
instance Data.Functor.Contravariant.Contravariant Data.Functor.Contravariant.Comparison -- Defined in ‘Data.Functor.Contravariant’
instance Data.Functor.Contravariant.Contravariant Data.Functor.Contravariant.Equivalence -- Defined in ‘Data.Functor.Contravariant’
instance forall a. Data.Functor.Contravariant.Contravariant (Data.Functor.Contravariant.Op a) -- Defined in ‘Data.Functor.Contravariant’
instance Data.Functor.Contravariant.Contravariant Data.Functor.Contravariant.Predicate -- Defined in ‘Data.Functor.Contravariant’
instance [safe] forall a. (a ~ ()) => Text.Printf.HPrintfType (GHC.Types.IO a) -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.IsChar GHC.Types.Char -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Types.Char -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Types.Double -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Types.Float -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Types.Int -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Int.Int16 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Int.Int32 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Int.Int64 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Int.Int8 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Num.Integer.Integer -- Defined in ‘Text.Printf’
instance [safe] forall c. Text.Printf.IsChar c => Text.Printf.PrintfArg [c] -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Num.Natural.Natural -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Types.Word -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Word.Word16 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Word.Word32 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Word.Word64 -- Defined in ‘Text.Printf’
instance [safe] Text.Printf.PrintfArg GHC.Word.Word8 -- Defined in ‘Text.Printf’
instance [safe] forall a. (a ~ ()) => Text.Printf.PrintfType (GHC.Types.IO a) -- Defined in ‘Text.Printf’
instance [safe] forall c. Text.Printf.IsChar c => Text.Printf.PrintfType [c] -- Defined in ‘Text.Printf’
instance forall (m :: * -> *). GHC.Base.Monad m => Control.Arrow.Arrow (Control.Arrow.Kleisli m) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *). GHC.Base.Monad m => Control.Arrow.ArrowApply (Control.Arrow.Kleisli m) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *). GHC.Base.Monad m => Control.Arrow.ArrowChoice (Control.Arrow.Kleisli m) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *). Control.Monad.Fix.MonadFix m => Control.Arrow.ArrowLoop (Control.Arrow.Kleisli m) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *). GHC.Base.MonadPlus m => Control.Arrow.ArrowPlus (Control.Arrow.Kleisli m) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *). GHC.Base.MonadPlus m => Control.Arrow.ArrowZero (Control.Arrow.Kleisli m) -- Defined in ‘Control.Arrow’
instance forall k. Control.Category.Category (Data.Type.Equality.:~:) -- Defined in ‘Control.Category’
instance forall k. Control.Category.Category (Data.Type.Equality.:~~:) -- Defined in ‘Control.Category’
instance forall k. Control.Category.Category Data.Type.Coercion.Coercion -- Defined in ‘Control.Category’
instance Control.Monad.Fail.MonadFail GHC.Types.IO -- Defined in ‘Control.Monad.Fail’
instance Control.Monad.Fail.MonadFail [] -- Defined in ‘Control.Monad.Fail’
instance Control.Monad.Fail.MonadFail GHC.Maybe.Maybe -- Defined in ‘Control.Monad.Fail’
instance Control.Monad.Fail.MonadFail Text.ParserCombinators.ReadP.P -- Defined in ‘Text.ParserCombinators.ReadP’
instance Control.Monad.Fail.MonadFail Text.ParserCombinators.ReadP.ReadP -- Defined in ‘Text.ParserCombinators.ReadP’
instance Control.Monad.Fail.MonadFail Text.ParserCombinators.ReadPrec.ReadPrec -- Defined in ‘Text.ParserCombinators.ReadPrec’
instance Control.Monad.Fix.MonadFix Data.Ord.Down -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix Data.Semigroup.Internal.Dual -- Defined in ‘Control.Monad.Fix’
instance forall e. Control.Monad.Fix.MonadFix (Data.Either.Either e) -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix Data.Monoid.First -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix GHC.Types.IO -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix Data.Monoid.Last -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix [] -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix GHC.Maybe.Maybe -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix GHC.Base.NonEmpty -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix GHC.Generics.Par1 -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix Data.Semigroup.Internal.Product -- Defined in ‘Control.Monad.Fix’
instance forall s. Control.Monad.Fix.MonadFix (GHC.ST.ST s) -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix Solo -- Defined in ‘Control.Monad.Fix’
instance Control.Monad.Fix.MonadFix Data.Semigroup.Internal.Sum -- Defined in ‘Control.Monad.Fix’
instance forall s. Control.Monad.Fix.MonadFix (ghc-internal-0.1.0.0:Control.Monad.ST.Lazy.Imp.ST s) -- Defined in ‘ghc-internal-0.1.0.0:Control.Monad.ST.Lazy.Imp’
instance Control.Monad.Fix.MonadFix Data.Complex.Complex -- Defined in ‘Data.Complex’
instance Control.Monad.Fix.MonadFix Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Identity’
instance Control.Monad.Fix.MonadFix Data.Semigroup.First -- Defined in ‘Data.Semigroup’
instance Control.Monad.Fix.MonadFix Data.Semigroup.Last -- Defined in ‘Data.Semigroup’
instance Control.Monad.Fix.MonadFix Data.Semigroup.Max -- Defined in ‘Data.Semigroup’
instance Control.Monad.Fix.MonadFix Data.Semigroup.Min -- Defined in ‘Data.Semigroup’
instance forall (a :: * -> * -> *) b c. (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable b, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable c, Data.Data.Data (a b c)) => Data.Data.Data (Control.Applicative.WrappedArrow a b c) -- Defined in ‘Control.Applicative’
instance forall (m :: * -> *) a. (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable m, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a, Data.Data.Data (m a)) => Data.Data.Data (Control.Applicative.WrappedMonad m a) -- Defined in ‘Control.Applicative’
instance forall a. Data.Data.Data a => Data.Data.Data (GHC.Functor.ZipList.ZipList a) -- Defined in ‘GHC.Functor.ZipList’
instance Data.Data.Data Data.Array.Byte.ByteArray -- Defined in ‘Data.Array.Byte’
instance forall s. ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable s => Data.Data.Data (Data.Array.Byte.MutableByteArray s) -- Defined in ‘Data.Array.Byte’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Complex.Complex a) -- Defined in ‘Data.Complex’
instance forall i j (a :: i) (b :: j). (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable i, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable j, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable b, a ~~ b) => Data.Data.Data (a Data.Type.Equality.:~~: b) -- Defined in ‘Data.Data’
instance Data.Data.Data Data.Semigroup.Internal.All -- Defined in ‘Data.Data’
instance Data.Data.Data Data.Semigroup.Internal.Any -- Defined in ‘Data.Data’
instance forall a b. (Data.Data.Data a, Data.Data.Data b, GHC.Ix.Ix a) => Data.Data.Data (GHC.Arr.Array a b) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Generics.Associativity -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Bool -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Char -- Defined in ‘Data.Data’
instance forall k a (b :: k). (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable k, Data.Data.Data a, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable b) => Data.Data.Data (Data.Functor.Const.Const a b) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Foreign.C.ConstPtr.ConstPtr a) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Generics.DecidedStrictness -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Double -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Ord.Down a) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.Internal.Dual a) -- Defined in ‘Data.Data’
instance forall a b. (Data.Data.Data a, Data.Data.Data b) => Data.Data.Data (Data.Either.Either a b) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Monoid.First a) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Generics.Fixity -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Float -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (GHC.ForeignPtr.ForeignPtr a) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Functor.Identity.Identity a) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Int -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Int.Int16 -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Int.Int32 -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Int.Int64 -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Int.Int8 -- Defined in ‘Data.Data’
instance Data.Data.Data Foreign.Ptr.IntPtr -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Num.Integer.Integer -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Monoid.Last a) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data [a] -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (GHC.Maybe.Maybe a) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Num.Natural.Natural -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (GHC.Base.NonEmpty a) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Ordering -- Defined in ‘Data.Data’
instance forall p. Data.Data.Data p => Data.Data.Data (GHC.Generics.Par1 p) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.Internal.Product a) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (GHC.Ptr.Ptr a) -- Defined in ‘Data.Data’
instance forall a. (Data.Data.Data a, GHC.Real.Integral a) => Data.Data.Data (GHC.Real.Ratio a) -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Solo a) -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Generics.SourceStrictness -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Generics.SourceUnpackedness -- Defined in ‘Data.Data’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.Internal.Sum a) -- Defined in ‘Data.Data’
instance forall a b. (Data.Data.Data a, Data.Data.Data b) => Data.Data.Data (a, b) -- Defined in ‘Data.Data’
instance forall a b c. (Data.Data.Data a, Data.Data.Data b, Data.Data.Data c) => Data.Data.Data (a, b, c) -- Defined in ‘Data.Data’
instance forall a b c d. (Data.Data.Data a, Data.Data.Data b, Data.Data.Data c, Data.Data.Data d) => Data.Data.Data (a, b, c, d) -- Defined in ‘Data.Data’
instance forall a b c d e. (Data.Data.Data a, Data.Data.Data b, Data.Data.Data c, Data.Data.Data d, Data.Data.Data e) => Data.Data.Data (a, b, c, d, e) -- Defined in ‘Data.Data’
instance forall a b c d e f. (Data.Data.Data a, Data.Data.Data b, Data.Data.Data c, Data.Data.Data d, Data.Data.Data e, Data.Data.Data f) => Data.Data.Data (a, b, c, d, e, f) -- Defined in ‘Data.Data’
instance forall a b c d e f g. (Data.Data.Data a, Data.Data.Data b, Data.Data.Data c, Data.Data.Data d, Data.Data.Data e, Data.Data.Data f, Data.Data.Data g) => Data.Data.Data (a, b, c, d, e, f, g) -- Defined in ‘Data.Data’
instance Data.Data.Data () -- Defined in ‘Data.Data’
instance Data.Data.Data Data.Version.Version -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Base.Void -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Types.Word -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Word.Word16 -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Word.Word32 -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Word.Word64 -- Defined in ‘Data.Data’
instance Data.Data.Data GHC.Word.Word8 -- Defined in ‘Data.Data’
instance Data.Data.Data Foreign.Ptr.WordPtr -- Defined in ‘Data.Data’
instance forall k (a :: k). (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable k, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a) => Data.Data.Data (Data.Fixed.Fixed a) -- Defined in ‘Data.Fixed’
instance forall k1 (f :: k1 -> *) k2 (g :: k2 -> k1) (a :: k2). (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable f, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable g, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable k1, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable k2, Data.Data.Data (f (g a))) => Data.Data.Data (Data.Functor.Compose.Compose f g a) -- Defined in ‘Data.Functor.Compose’
instance [safe] forall k (f :: k -> *) (g :: k -> *) (a :: k). (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable f, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable g, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable k, Data.Data.Data (f a), Data.Data.Data (g a)) => Data.Data.Data (Data.Functor.Product.Product f g a) -- Defined in ‘Data.Functor.Product’
instance [safe] forall k (f :: k -> *) (g :: k -> *) (a :: k). (ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable a, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable f, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable g, ghc-internal-0.1.0.0:Data.Typeable.Internal.Typeable k, Data.Data.Data (f a), Data.Data.Data (g a)) => Data.Data.Data (Data.Functor.Sum.Sum f g a) -- Defined in ‘Data.Functor.Sum’
instance forall a b. (Data.Data.Data a, Data.Data.Data b) => Data.Data.Data (Data.Semigroup.Arg a b) -- Defined in ‘Data.Semigroup’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.First a) -- Defined in ‘Data.Semigroup’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.Last a) -- Defined in ‘Data.Semigroup’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.Max a) -- Defined in ‘Data.Semigroup’
instance forall a. Data.Data.Data a => Data.Data.Data (Data.Semigroup.Min a) -- Defined in ‘Data.Semigroup’
instance forall m. Data.Data.Data m => Data.Data.Data (Data.Semigroup.WrappedMonoid m) -- Defined in ‘Data.Semigroup’
instance Data.Data.Data GHC.Exts.SpecConstrAnnotation -- Defined in ‘GHC.Exts’
instance Data.Foldable.Foldable GHC.Functor.ZipList.ZipList -- Defined in ‘GHC.Functor.ZipList’
instance forall i. Data.Foldable.Foldable (GHC.Arr.Array i) -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Ord.Down -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Semigroup.Internal.Dual -- Defined in ‘Data.Foldable’
instance forall a. Data.Foldable.Foldable (Data.Either.Either a) -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Monoid.First -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Monoid.Last -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable [] -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable GHC.Maybe.Maybe -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable GHC.Base.NonEmpty -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable GHC.Generics.Par1 -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Semigroup.Internal.Product -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Solo -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Semigroup.Internal.Sum -- Defined in ‘Data.Foldable’
instance forall a. Data.Foldable.Foldable ((,) a) -- Defined in ‘Data.Foldable’
instance Data.Foldable.Foldable Data.Complex.Complex -- Defined in ‘Data.Complex’
instance Data.Foldable.Foldable Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Identity’
instance forall a. Data.Foldable.Foldable (Data.Semigroup.Arg a) -- Defined in ‘Data.Semigroup’
instance Data.Foldable.Foldable Data.Semigroup.First -- Defined in ‘Data.Semigroup’
instance Data.Foldable.Foldable Data.Semigroup.Last -- Defined in ‘Data.Semigroup’
instance Data.Foldable.Foldable Data.Semigroup.Max -- Defined in ‘Data.Semigroup’
instance Data.Foldable.Foldable Data.Semigroup.Min -- Defined in ‘Data.Semigroup’
instance forall a k (b :: k). Data.String.IsString a => Data.String.IsString (Data.Functor.Const.Const a b) -- Defined in ‘Data.String’
instance forall a. Data.String.IsString a => Data.String.IsString (Data.Functor.Identity.Identity a) -- Defined in ‘Data.String’
instance forall a. (a ~ GHC.Types.Char) => Data.String.IsString [a] -- Defined in ‘Data.String’
instance Data.Traversable.Traversable GHC.Functor.ZipList.ZipList -- Defined in ‘GHC.Functor.ZipList’
instance forall i. GHC.Ix.Ix i => Data.Traversable.Traversable (GHC.Arr.Array i) -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Ord.Down -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Semigroup.Internal.Dual -- Defined in ‘Data.Traversable’
instance forall a. Data.Traversable.Traversable (Data.Either.Either a) -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Monoid.First -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Functor.Identity.Identity -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Monoid.Last -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable [] -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable GHC.Maybe.Maybe -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable GHC.Base.NonEmpty -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable GHC.Generics.Par1 -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Semigroup.Internal.Product -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Solo -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Semigroup.Internal.Sum -- Defined in ‘Data.Traversable’
instance forall a. Data.Traversable.Traversable ((,) a) -- Defined in ‘Data.Traversable’
instance Data.Traversable.Traversable Data.Complex.Complex -- Defined in ‘Data.Complex’
instance forall a. Data.Traversable.Traversable (Data.Semigroup.Arg a) -- Defined in ‘Data.Semigroup’
instance Data.Traversable.Traversable Data.Semigroup.First -- Defined in ‘Data.Semigroup’
instance Data.Traversable.Traversable Data.Semigroup.Last -- Defined in ‘Data.Semigroup’
instance Data.Traversable.Traversable Data.Semigroup.Max -- Defined in ‘Data.Semigroup’
instance Data.Traversable.Traversable Data.Semigroup.Min -- Defined in ‘Data.Semigroup’
instance Data.Type.Coercion.TestCoercion GHC.TypeLits.SChar -- Defined in ‘GHC.TypeLits’
instance Data.Type.Coercion.TestCoercion GHC.TypeLits.SSymbol -- Defined in ‘GHC.TypeLits’
instance Data.Type.Coercion.TestCoercion GHC.TypeNats.SNat -- Defined in ‘GHC.TypeNats’
instance forall k (a :: k). Data.Type.Coercion.TestCoercion ((Data.Type.Equality.:~:) a) -- Defined in ‘Data.Type.Coercion’
instance forall k1 k (a :: k1). Data.Type.Coercion.TestCoercion ((Data.Type.Equality.:~~:) a) -- Defined in ‘Data.Type.Coercion’
instance forall k (a :: k). Data.Type.Coercion.TestCoercion (Data.Type.Coercion.Coercion a) -- Defined in ‘Data.Type.Coercion’
instance Data.Type.Equality.TestEquality GHC.TypeLits.SChar -- Defined in ‘GHC.TypeLits’
instance Data.Type.Equality.TestEquality GHC.TypeLits.SSymbol -- Defined in ‘GHC.TypeLits’
instance Data.Type.Equality.TestEquality GHC.TypeNats.SNat -- Defined in ‘GHC.TypeNats’
instance forall k (a :: k). Data.Type.Equality.TestEquality ((Data.Type.Equality.:~:) a) -- Defined in ‘Data.Type.Equality’
instance forall k1 k (a :: k1). Data.Type.Equality.TestEquality ((Data.Type.Equality.:~~:) a) -- Defined in ‘Data.Type.Equality’
instance forall k. Data.Type.Equality.TestEquality ghc-internal-0.1.0.0:Data.Typeable.Internal.TypeRep -- Defined in ‘ghc-internal-0.1.0.0:Data.Typeable.Internal’
instance forall k1 k2 (f :: k1 -> *) (g :: k2 -> k1). Data.Type.Equality.TestEquality f => Data.Type.Equality.TestEquality (Data.Functor.Compose.Compose f g) -- Defined in ‘Data.Functor.Compose’
instance forall a k (b :: k). Foreign.Storable.Storable a => Foreign.Storable.Storable (Data.Functor.Const.Const a b) -- Defined in ‘Data.Functor.Const’
instance forall a. Foreign.Storable.Storable a => Foreign.Storable.Storable (Data.Complex.Complex a) -- Defined in ‘Data.Complex’
instance forall a. Foreign.Storable.Storable a => Foreign.Storable.Storable (Data.Functor.Identity.Identity a) -- Defined in ‘Data.Functor.Identity’
instance forall a. Foreign.Storable.Storable a => Foreign.Storable.Storable (Data.Ord.Down a) -- Defined in ‘Data.Ord’
instance Foreign.Storable.Storable Foreign.Ptr.IntPtr -- Defined in ‘Foreign.Ptr’
instance Foreign.Storable.Storable Foreign.Ptr.WordPtr -- Defined in ‘Foreign.Ptr’
instance Foreign.Storable.Storable GHC.Types.Bool -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Types.Char -- Defined in ‘Foreign.Storable’
instance forall a. Foreign.Storable.Storable (Foreign.C.ConstPtr.ConstPtr a) -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Types.Double -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Fingerprint.Type.Fingerprint -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Types.Float -- Defined in ‘Foreign.Storable’
instance forall a. Foreign.Storable.Storable (GHC.Ptr.FunPtr a) -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Types.Int -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Int.Int16 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Int.Int32 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Int.Int64 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Int.Int8 -- Defined in ‘Foreign.Storable’
instance forall a. Foreign.Storable.Storable (GHC.Ptr.Ptr a) -- Defined in ‘Foreign.Storable’
instance forall a. (Foreign.Storable.Storable a, GHC.Real.Integral a) => Foreign.Storable.Storable (GHC.Real.Ratio a) -- Defined in ‘Foreign.Storable’
instance forall a. Foreign.Storable.Storable (GHC.Stable.StablePtr a) -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable () -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Types.Word -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Word.Word16 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Word.Word32 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Word.Word64 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.Word.Word8 -- Defined in ‘Foreign.Storable’
instance Foreign.Storable.Storable GHC.RTS.Flags.IoSubSystem -- Defined in ‘GHC.RTS.Flags’
instance forall (a :: * -> * -> *) b. (Control.Arrow.ArrowZero a, Control.Arrow.ArrowPlus a) => GHC.Base.Alternative (Control.Applicative.WrappedArrow a b) -- Defined in ‘Control.Applicative’
instance forall (m :: * -> *). GHC.Base.MonadPlus m => GHC.Base.Alternative (Control.Applicative.WrappedMonad m) -- Defined in ‘Control.Applicative’
instance GHC.Base.Alternative GHC.Types.IO -- Defined in ‘GHC.Base’
instance GHC.Base.Alternative [] -- Defined in ‘GHC.Base’
instance GHC.Base.Alternative GHC.Maybe.Maybe -- Defined in ‘GHC.Base’
instance GHC.Base.Alternative GHC.Functor.ZipList.ZipList -- Defined in ‘GHC.Functor.ZipList’
instance forall (a :: * -> * -> *). Control.Arrow.ArrowPlus a => GHC.Base.Alternative (Control.Arrow.ArrowMonad a) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *) a. GHC.Base.Alternative m => GHC.Base.Alternative (Control.Arrow.Kleisli m a) -- Defined in ‘Control.Arrow’
instance GHC.Base.Alternative GHC.Conc.Sync.STM -- Defined in ‘GHC.Conc.Sync’
instance GHC.Base.Alternative Text.ParserCombinators.ReadP.P -- Defined in ‘Text.ParserCombinators.ReadP’
instance GHC.Base.Alternative Text.ParserCombinators.ReadP.ReadP -- Defined in ‘Text.ParserCombinators.ReadP’
instance GHC.Base.Alternative Text.ParserCombinators.ReadPrec.ReadPrec -- Defined in ‘Text.ParserCombinators.ReadPrec’
instance forall (a :: * -> * -> *) b. Control.Arrow.Arrow a => GHC.Base.Applicative (Control.Applicative.WrappedArrow a b) -- Defined in ‘Control.Applicative’
instance forall (m :: * -> *). GHC.Base.Monad m => GHC.Base.Applicative (Control.Applicative.WrappedMonad m) -- Defined in ‘Control.Applicative’
instance GHC.Base.Applicative GHC.Types.IO -- Defined in ‘GHC.Base’
instance GHC.Base.Applicative [] -- Defined in ‘GHC.Base’
instance GHC.Base.Applicative GHC.Maybe.Maybe -- Defined in ‘GHC.Base’
instance GHC.Base.Applicative GHC.Base.NonEmpty -- Defined in ‘GHC.Base’
instance GHC.Base.Applicative Solo -- Defined in ‘GHC.Base’
instance forall a. GHC.Base.Monoid a => GHC.Base.Applicative ((,) a) -- Defined in ‘GHC.Base’
instance forall a b. (GHC.Base.Monoid a, GHC.Base.Monoid b) => GHC.Base.Applicative ((,,) a b) -- Defined in ‘GHC.Base’
instance forall a b c. (GHC.Base.Monoid a, GHC.Base.Monoid b, GHC.Base.Monoid c) => GHC.Base.Applicative ((,,,) a b c) -- Defined in ‘GHC.Base’
instance GHC.Base.Applicative GHC.Functor.ZipList.ZipList -- Defined in ‘GHC.Functor.ZipList’
instance forall (a :: * -> * -> *). Control.Arrow.Arrow a => GHC.Base.Applicative (Control.Arrow.ArrowMonad a) -- Defined in ‘Control.Arrow’
instance forall (m :: * -> *) a. GHC.Base.Applicative m => GHC.Base.Applicative (Control.Arrow.Kleisli m a) -- Defined in ‘Control.Arrow’
instance GHC.Base.Applicative GHC.Conc.Sync.STM -- Defined in ‘GHC.Conc.Sync’
instance forall s. GHC.Base.Applicative (GHC.ST.ST s) -- Defined in ‘GHC.ST’
instance forall s. GHC.Base.Applicative (ghc-internal-0.1.0.0:Control.Monad.ST.Lazy.Imp.ST s) -- Defined in ‘ghc-internal-0.1.0.0:Control.Monad.ST.Lazy.Imp’
instance GHC.Base.Applicative Data.Complex.Complex -- Defined in ‘Data.Complex’
instance forall e. GHC.Base.Applicative (Data.Either.Either e) -- Defined in ‘Data.Either’
instance GHC.Base.Applicative Data.Functor.Identity.Identity -- Defined in ‘Data.Functor.Identity’
instance GHC.Base.Applicative Data.Monoid.First -- Defined in ‘Data.Monoid’
instance GHC.Base.Applicative Data.Monoid.Last -- Defined in ‘Data.Monoid’
instance GHC.Base.Applicative Data.Semigroup.Internal.Dual -- Defined in ‘Data.Semigroup.Internal’
instance GHC.Base.Applicative Data.Semigroup.Internal.Product -- Defined in ‘Data.Semigroup.Internal’
instance GHC.Base.Applicative Data.Semigroup.Internal.Sum -- Defined in ‘Data.Semigroup.Internal’
instance GHC.Base.Applicative Data.Ord.Down -- Defined in ‘Data.Ord’
instance GHC.Base.Applicative Data.Semigroup.First -- Defined in ‘Data.Semigroup’
instance GHC.Base.Applicative Data.Semigroup.Last -- Defined in ‘Data.Semigroup’
instance GHC.Base.Applicative Data.Semigroup.Max -- Defined in ‘Data.Semigroup’
instance GHC.Base.Applicative Data.Semigroup.Min -- Defined in ‘Data.Semigroup’
instance GHC.Base.Applicative GHC.GHCi.NoIO -- Defined in ‘GHC.GHCi’
instance GHC.Base.Applicative GHC.Generics.Par1 -- Defined in ‘GHC.Generics’
instance GHC.Base.Applicative Text.ParserCombinators.ReadP.P -- Defined in ‘Text.ParserCombinators.ReadP’
instance GHC.Base.Applicative Text.ParserCombinators.ReadP.ReadP -- Defined in ‘Text.ParserCombinators.ReadP’
instance GHC.Base.Applicative Text.ParserCombinators.ReadPrec.ReadPrec -- Defined in ‘Text.ParserCombinators.ReadPrec’
instance forall (a :: * -> * -> *) b. Control.Arrow.Arrow a => GHC.Base.Functor (Control.Applicative.WrappedArrow a b) -- Defined in ‘Control.Applicative’
instance forall (m :: * -> *). GHC.Base.Monad m => GHC.Base.Functor (Control.Applicative.WrappedMonad m) -- Defined in ‘Control.Applicative’
instance GHC.Base.Functor GHC.Types.IO -- Defined in ‘GHC.Base’
instance GHC.Base.Functor [] -- Defined in ‘GHC.Base’
instance GHC.Base.Functor GHC.Maybe.Maybe -- Defined in ‘GHC.Base’
instance GHC.Base.Functor GHC.Base.NonEmpty -- Defined in ‘GHC.Base’
instance GHC.Base.Functor Solo -- Defined in ‘GHC.Base’
instance forall a. GHC.Base.Functor ((,) a) -- Defined in ‘GHC.Base’
instance forall a b. GHC.Base.Functor ((,,) a b) -- Defined in ‘GHC.Base’
instance forall a b c. GHC.Base.Functor ((,,,) a b c) -- Defined in ‘GHC.Base’
instance forall a b c d. GHC.Base.Functor ((,,,,) a b c d) -- Defined in ‘GHC.Base’
instance forall a b c d e. GHC.Base.Functor ((,,,,,) a b c d e) -- Defined in ‘GHC.Base’
instance forall a b c d e f. GHC.Base.Functor ((,,,,,,) a b c d e f) -- Defined in ‘GHC.Base’
instance GHC.Base.Functor GHC.Functor.ZipList.ZipList -- Defined in ‘GHC.Functor.ZipList’