-- | Some types used by the other modules in this package.
module System.Posix.IO.Select.Types where

type Seconds = Int
type Microseconds = Int

-- | A timeout of @'Never'@ tells @select(2)@ to never time out, while
-- @'Time' s us@ sets the timeout parameters to @s@ seconds and @us@
-- microseconds.
data Timeout = Never | Time Seconds Microseconds