module System.Nix.StorePathMetadata where
import System.Nix.StorePath ( StorePath
, StorePathSet
, ContentAddressableAddress
)
import System.Nix.Hash ( SomeNamedDigest )
import Data.Time ( UTCTime )
import System.Nix.Signature ( NarSignature )
data StorePathMetadata = StorePathMetadata
{
StorePathMetadata -> StorePath
path :: !StorePath
,
StorePathMetadata -> Maybe StorePath
deriverPath :: !(Maybe StorePath)
,
StorePathMetadata -> SomeNamedDigest
narHash :: !SomeNamedDigest
,
StorePathMetadata -> StorePathSet
references :: !StorePathSet
,
StorePathMetadata -> UTCTime
registrationTime :: !UTCTime
,
StorePathMetadata -> Maybe Word64
narBytes :: !(Maybe Word64)
,
StorePathMetadata -> StorePathTrust
trust :: !StorePathTrust
,
StorePathMetadata -> Set NarSignature
sigs :: !(Set NarSignature)
,
StorePathMetadata -> Maybe ContentAddressableAddress
contentAddressableAddress :: !(Maybe ContentAddressableAddress)
}
data StorePathTrust
=
BuiltLocally
|
BuiltElsewhere
deriving (Int -> StorePathTrust -> ShowS
[StorePathTrust] -> ShowS
StorePathTrust -> String
(Int -> StorePathTrust -> ShowS)
-> (StorePathTrust -> String)
-> ([StorePathTrust] -> ShowS)
-> Show StorePathTrust
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [StorePathTrust] -> ShowS
$cshowList :: [StorePathTrust] -> ShowS
show :: StorePathTrust -> String
$cshow :: StorePathTrust -> String
showsPrec :: Int -> StorePathTrust -> ShowS
$cshowsPrec :: Int -> StorePathTrust -> ShowS
Show, StorePathTrust -> StorePathTrust -> Bool
(StorePathTrust -> StorePathTrust -> Bool)
-> (StorePathTrust -> StorePathTrust -> Bool) -> Eq StorePathTrust
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: StorePathTrust -> StorePathTrust -> Bool
$c/= :: StorePathTrust -> StorePathTrust -> Bool
== :: StorePathTrust -> StorePathTrust -> Bool
$c== :: StorePathTrust -> StorePathTrust -> Bool
Eq, Eq StorePathTrust
Eq StorePathTrust
-> (StorePathTrust -> StorePathTrust -> Ordering)
-> (StorePathTrust -> StorePathTrust -> Bool)
-> (StorePathTrust -> StorePathTrust -> Bool)
-> (StorePathTrust -> StorePathTrust -> Bool)
-> (StorePathTrust -> StorePathTrust -> Bool)
-> (StorePathTrust -> StorePathTrust -> StorePathTrust)
-> (StorePathTrust -> StorePathTrust -> StorePathTrust)
-> Ord StorePathTrust
StorePathTrust -> StorePathTrust -> Bool
StorePathTrust -> StorePathTrust -> Ordering
StorePathTrust -> StorePathTrust -> StorePathTrust
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
min :: StorePathTrust -> StorePathTrust -> StorePathTrust
$cmin :: StorePathTrust -> StorePathTrust -> StorePathTrust
max :: StorePathTrust -> StorePathTrust -> StorePathTrust
$cmax :: StorePathTrust -> StorePathTrust -> StorePathTrust
>= :: StorePathTrust -> StorePathTrust -> Bool
$c>= :: StorePathTrust -> StorePathTrust -> Bool
> :: StorePathTrust -> StorePathTrust -> Bool
$c> :: StorePathTrust -> StorePathTrust -> Bool
<= :: StorePathTrust -> StorePathTrust -> Bool
$c<= :: StorePathTrust -> StorePathTrust -> Bool
< :: StorePathTrust -> StorePathTrust -> Bool
$c< :: StorePathTrust -> StorePathTrust -> Bool
compare :: StorePathTrust -> StorePathTrust -> Ordering
$ccompare :: StorePathTrust -> StorePathTrust -> Ordering
$cp1Ord :: Eq StorePathTrust
Ord)