{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DeriveAnyClass #-}
module Nix.NarInfo.Types
(
NarInfo(..)
, SimpleNarInfo
) where
import Data.Set (Set)
import Data.Text (Text)
import GHC.Generics
data NarInfo fp txt hash = NarInfo
{
forall fp txt hash. NarInfo fp txt hash -> fp
storePath :: fp
,
forall fp txt hash. NarInfo fp txt hash -> txt
url :: txt
,
forall fp txt hash. NarInfo fp txt hash -> txt
compression :: txt
,
forall fp txt hash. NarInfo fp txt hash -> hash
fileHash :: hash
,
forall fp txt hash. NarInfo fp txt hash -> Integer
fileSize :: Integer
,
forall fp txt hash. NarInfo fp txt hash -> hash
narHash :: hash
,
forall fp txt hash. NarInfo fp txt hash -> Integer
narSize :: Integer
,
forall fp txt hash. NarInfo fp txt hash -> Set fp
references :: Set fp
,
forall fp txt hash. NarInfo fp txt hash -> Maybe txt
deriver :: Maybe txt
,
forall fp txt hash. NarInfo fp txt hash -> Maybe txt
system :: Maybe txt
,
forall fp txt hash. NarInfo fp txt hash -> Maybe txt
sig :: Maybe txt
,
forall fp txt hash. NarInfo fp txt hash -> Maybe txt
ca :: Maybe txt
}
deriving (NarInfo fp txt hash -> NarInfo fp txt hash -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
forall fp txt hash.
(Eq fp, Eq txt, Eq hash) =>
NarInfo fp txt hash -> NarInfo fp txt hash -> Bool
/= :: NarInfo fp txt hash -> NarInfo fp txt hash -> Bool
$c/= :: forall fp txt hash.
(Eq fp, Eq txt, Eq hash) =>
NarInfo fp txt hash -> NarInfo fp txt hash -> Bool
== :: NarInfo fp txt hash -> NarInfo fp txt hash -> Bool
$c== :: forall fp txt hash.
(Eq fp, Eq txt, Eq hash) =>
NarInfo fp txt hash -> NarInfo fp txt hash -> Bool
Eq, forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall fp txt hash x.
Rep (NarInfo fp txt hash) x -> NarInfo fp txt hash
forall fp txt hash x.
NarInfo fp txt hash -> Rep (NarInfo fp txt hash) x
$cto :: forall fp txt hash x.
Rep (NarInfo fp txt hash) x -> NarInfo fp txt hash
$cfrom :: forall fp txt hash x.
NarInfo fp txt hash -> Rep (NarInfo fp txt hash) x
Generic, Int -> NarInfo fp txt hash -> ShowS
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
forall fp txt hash.
(Show fp, Show txt, Show hash) =>
Int -> NarInfo fp txt hash -> ShowS
forall fp txt hash.
(Show fp, Show txt, Show hash) =>
[NarInfo fp txt hash] -> ShowS
forall fp txt hash.
(Show fp, Show txt, Show hash) =>
NarInfo fp txt hash -> String
showList :: [NarInfo fp txt hash] -> ShowS
$cshowList :: forall fp txt hash.
(Show fp, Show txt, Show hash) =>
[NarInfo fp txt hash] -> ShowS
show :: NarInfo fp txt hash -> String
$cshow :: forall fp txt hash.
(Show fp, Show txt, Show hash) =>
NarInfo fp txt hash -> String
showsPrec :: Int -> NarInfo fp txt hash -> ShowS
$cshowsPrec :: forall fp txt hash.
(Show fp, Show txt, Show hash) =>
Int -> NarInfo fp txt hash -> ShowS
Show)
type SimpleNarInfo = NarInfo FilePath Text Text