{-# LINE 1 "GHCi/InfoTable.hsc" #-}
{-# LANGUAGE CPP, MagicHash, ScopedTypeVariables #-}

-- Get definitions for the structs, constants & config etc.


-- |
-- Run-time info table support.  This module provides support for
-- creating and reading info tables /in the running program/.
-- We use the RTS data structures directly via hsc2hs.
--
module GHCi.InfoTable
  (

{-# LINE 16 "GHCi/InfoTable.hsc" #-}
  ) where

import Prelude -- See note [Why do we import Prelude here?]

{-# LINE 26 "GHCi/InfoTable.hsc" #-}

ghciTablesNextToCode :: Bool

{-# LINE 29 "GHCi/InfoTable.hsc" #-}
ghciTablesNextToCode = True

{-# LINE 33 "GHCi/InfoTable.hsc" #-}


{-# LINE 386 "GHCi/InfoTable.hsc" #-}