-- |
-- Module      : Foundation.System.Entropy.Common
-- License     : BSD-style
-- Maintainer  : Vincent Hanquez <vincent@snarc.org>
-- Stability   : experimental
-- Portability : portable
--
-- Common part for vectors
--
{-# LANGUAGE DeriveDataTypeable #-}
module Foundation.System.Entropy.Common
    ( EntropySystemMissing(..)
    ) where

import Basement.Compat.Base

data EntropySystemMissing = EntropySystemMissing
    deriving (Int -> EntropySystemMissing -> ShowS
[EntropySystemMissing] -> ShowS
EntropySystemMissing -> String
(Int -> EntropySystemMissing -> ShowS)
-> (EntropySystemMissing -> String)
-> ([EntropySystemMissing] -> ShowS)
-> Show EntropySystemMissing
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [EntropySystemMissing] -> ShowS
$cshowList :: [EntropySystemMissing] -> ShowS
show :: EntropySystemMissing -> String
$cshow :: EntropySystemMissing -> String
showsPrec :: Int -> EntropySystemMissing -> ShowS
$cshowsPrec :: Int -> EntropySystemMissing -> ShowS
Show,EntropySystemMissing -> EntropySystemMissing -> Bool
(EntropySystemMissing -> EntropySystemMissing -> Bool)
-> (EntropySystemMissing -> EntropySystemMissing -> Bool)
-> Eq EntropySystemMissing
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EntropySystemMissing -> EntropySystemMissing -> Bool
$c/= :: EntropySystemMissing -> EntropySystemMissing -> Bool
== :: EntropySystemMissing -> EntropySystemMissing -> Bool
$c== :: EntropySystemMissing -> EntropySystemMissing -> Bool
Eq,Typeable)

instance Exception EntropySystemMissing