(original) (raw)

{-# LANGUAGE Trustworthy #-} {-# LANGUAGE NoImplicitPrelude #-}


-- Maintainer : libraries@haskell.org -- Stability : stable -- Portability : portable

-- Signed integer types


module Data.Int ( -- * Signed integer types Int, Int8, Int16, Int32, Int64,

    -- * Notes

    -- $notes
    ) where

import GHC.Base ( Int ) import GHC.Int ( Int8, Int16, Int32, Int64 )

{- $notes