nix-graph-1.0.0.0: Reify the Nix build graph into a Haskell graph data structure
Safe HaskellNone
LanguageHaskell2010

Nix.Graph.Internal

Synopsis

Documentation

data Derivation Source #

Instances

Instances details
Eq Derivation Source # 
Instance details

Defined in Nix.Graph.Internal

Ord Derivation Source # 
Instance details

Defined in Nix.Graph.Internal

Generic Derivation Source # 
Instance details

Defined in Nix.Graph.Internal

Associated Types

type Rep Derivation :: Type -> Type #

Hashable Derivation Source # 
Instance details

Defined in Nix.Graph.Internal

type Rep Derivation Source # 
Instance details

Defined in Nix.Graph.Internal

type Rep Derivation = D1 ('MetaData "Derivation" "Nix.Graph.Internal" "nix-graph-1.0.0.0-7rxHZl2ZpuxI9mrsd5phgY" 'False) (C1 ('MetaCons "Derivation" 'PrefixI 'True) (S1 ('MetaSel ('Just "derivationPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: (S1 ('MetaSel ('Just "derivationInputDrvs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "derivationBuilt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

buildAdjacencyMap :: MonadIO m => Eq k => Hashable k => (k -> IO (Set k)) -> [k] -> m [(k, Set k)] Source #

data Config Source #

Constructors

Config 

data Exclude Source #

Instances

Instances details
Eq Exclude Source # 
Instance details

Defined in Nix.Graph.Internal

Methods

(==) :: Exclude -> Exclude -> Bool #

(/=) :: Exclude -> Exclude -> Bool #

build Source #

Arguments

:: MonadIO m 
=> Config

Configure how the graph is built

-> [FilePath]

Derivations to build graph from

-> m (AdjacencyMap FilePath) 

Build graph of dependencies