{-# LINE 1 "libraries/ghc-internal/src/GHC/Internal/ConsoleHandler.hsc" #-}
{-# LANGUAGE Trustworthy #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE CPP #-}

-----------------------------------------------------------------------------
-- |
-- Module      :  GHC.Internal.ConsoleHandler
-- Copyright   :  (c) The University of Glasgow
-- License     :  see libraries/base/LICENSE
--
-- Maintainer  :  ghc-devs@haskell.org
-- Stability   :  internal
-- Portability :  non-portable (GHC extensions)
--
-- NB. the contents of this module are only available on Windows.
--
-- Installing Win32 console handlers.
--
-----------------------------------------------------------------------------

module GHC.Internal.ConsoleHandler

{-# LINE 23 "libraries/ghc-internal/src/GHC/Internal/ConsoleHandler.hsc" #-}
        where

-- See W1 of Note [Tracking dependencies on primitives] in GHC.Internal.Base
import GHC.Types ()

{-# LINE 147 "libraries/ghc-internal/src/GHC/Internal/ConsoleHandler.hsc" #-}