{-# LINE 1 "libraries/base/GHC/Event/EPoll.hsc" #-}
{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE Trustworthy #-}
module GHC.Event.EPoll
(
new
, available
) where
import qualified GHC.Event.Internal as E
{-# LINE 28 "libraries/base/GHC/Event/EPoll.hsc" #-}
import GHC.Base
new :: IO E.Backend
new :: IO Backend
new = [Char] -> IO Backend
forall a. [Char] -> a
errorWithoutStackTrace [Char]
"EPoll back end not implemented for this platform"
available :: Bool
available :: Bool
available = Bool
False
{-# INLINE available #-}
{-# LINE 245 "libraries/base/GHC/Event/EPoll.hsc" #-}