A RetroSearch Logo

Home - News ( United States | United Kingdom | Italy | Germany ) - Football scores

Search Query:

Showing content from http://hackage.haskell.org/package/ghc-internal-9.1201.0/docs/src/GHC.Internal.Event.TimeOut.html below:

{-# LANGUAGE NoImplicitPrelude #-}



















module GHC.Internal.Event.TimeOut
    ( TimeoutQueue
    , TimeoutCallback
    , TimeoutEdit
    , TimeoutKey(..)
    ) where

import GHC.Internal.IO
import GHC.Internal.Base

import qualified GHC.Internal.Event.PSQ as Q
import GHC.Internal.Event.Unique (Unique)


type TimeoutQueue = Q.PSQ TimeoutCallback







type TimeoutCallback = IO ()


type TimeoutEdit = TimeoutQueue -> TimeoutQueue


newtype TimeoutKey = TK Unique
    deriving (TimeoutKey -> TimeoutKey -> Bool
(TimeoutKey -> TimeoutKey -> Bool)
-> (TimeoutKey -> TimeoutKey -> Bool) -> Eq TimeoutKey
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TimeoutKey -> TimeoutKey -> Bool
== :: TimeoutKey -> TimeoutKey -> Bool
$c/= :: TimeoutKey -> TimeoutKey -> Bool
/= :: TimeoutKey -> TimeoutKey -> Bool
Eq, Eq TimeoutKey Eq TimeoutKey => (TimeoutKey -> TimeoutKey -> Ordering) -> (TimeoutKey -> TimeoutKey -> Bool) -> (TimeoutKey -> TimeoutKey -> Bool) -> (TimeoutKey -> TimeoutKey -> Bool) -> (TimeoutKey -> TimeoutKey -> Bool) -> (TimeoutKey -> TimeoutKey -> TimeoutKey) -> (TimeoutKey -> TimeoutKey -> TimeoutKey) -> Ord TimeoutKey TimeoutKey -> TimeoutKey -> Bool TimeoutKey -> TimeoutKey -> Ordering TimeoutKey -> TimeoutKey -> TimeoutKey forall a. Eq a => (a -> a -> Ordering) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> a) -> (a -> a -> a) -> Ord a $ccompare :: TimeoutKey -> TimeoutKey -> Ordering compare :: TimeoutKey -> TimeoutKey -> Ordering $c< :: TimeoutKey -> TimeoutKey -> Bool < :: TimeoutKey -> TimeoutKey -> Bool $c<= :: TimeoutKey -> TimeoutKey -> Bool <= :: TimeoutKey -> TimeoutKey -> Bool $c> :: TimeoutKey -> TimeoutKey -> Bool > :: TimeoutKey -> TimeoutKey -> Bool $c>= :: TimeoutKey -> TimeoutKey -> Bool >= :: TimeoutKey -> TimeoutKey -> Bool $cmax :: TimeoutKey -> TimeoutKey -> TimeoutKey max :: TimeoutKey -> TimeoutKey -> TimeoutKey $cmin :: TimeoutKey -> TimeoutKey -> TimeoutKey min :: TimeoutKey -> TimeoutKey -> TimeoutKey Ord)

RetroSearch is an open source project built by @garambo | Open a GitHub Issue

Search and Browse the WWW like it's 1997 | Search results from DuckDuckGo

HTML: 3.2 | Encoding: UTF-8 | Version: 0.7.4