guardian-0.4.0.0: The border guardian for your package dependencies
Safe HaskellSafe-Inferred
LanguageHaskell2010

Development.Guardian.Graph.Adapter.Types

Documentation

newtype PackageBuildParser backend Source #

Instances

Instances details
FromJSON (CustomPackageOptions backend) => FromJSON (PackageBuildParser backend) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

data family CustomPackageOptions backend Source #

Instances

Instances details
FromJSON (CustomPackageOptions Cabal) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

FromJSON (CustomPackageOptions Stack) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

Generic (CustomPackageOptions Cabal) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

Associated Types

type Rep (CustomPackageOptions Cabal) :: Type -> Type #

Generic (CustomPackageOptions Stack) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

Associated Types

type Rep (CustomPackageOptions Stack) :: Type -> Type #

Show (CustomPackageOptions Cabal) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

Show (CustomPackageOptions Stack) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

Eq (CustomPackageOptions Cabal) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

Eq (CustomPackageOptions Stack) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

Ord (CustomPackageOptions Cabal) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

Ord (CustomPackageOptions Stack) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

data CustomPackageOptions Cabal Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

newtype CustomPackageOptions Stack Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

type Rep (CustomPackageOptions Cabal) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Cabal

type Rep (CustomPackageOptions Cabal) = D1 ('MetaData "CustomPackageOptions" "Development.Guardian.Graph.Adapter.Cabal" "guardian-0.4.0.0-1i0KmpldsqDJPVBdForgqe" 'False) (C1 ('MetaCons "CabalOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "projectFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Path Rel File))) :*: S1 ('MetaSel ('Just "update") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Either Bool String)))))
type Rep (CustomPackageOptions Stack) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Stack

type Rep (CustomPackageOptions Stack) = D1 ('MetaData "CustomPackageOptions" "Development.Guardian.Graph.Adapter.Stack" "guardian-0.4.0.0-1i0KmpldsqDJPVBdForgqe" 'True) (C1 ('MetaCons "StackOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "stackOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text])))

data PackageGraphOptions backend Source #

Instances

Instances details
Generic (PackageGraphOptions backend) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Associated Types

type Rep (PackageGraphOptions backend) :: Type -> Type #

Methods

from :: PackageGraphOptions backend -> Rep (PackageGraphOptions backend) x #

to :: Rep (PackageGraphOptions backend) x -> PackageGraphOptions backend #

Show (CustomPackageOptions backend) => Show (PackageGraphOptions backend) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Eq (CustomPackageOptions backend) => Eq (PackageGraphOptions backend) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Methods

(==) :: PackageGraphOptions backend -> PackageGraphOptions backend -> Bool #

(/=) :: PackageGraphOptions backend -> PackageGraphOptions backend -> Bool #

Ord (CustomPackageOptions backend) => Ord (PackageGraphOptions backend) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

type Rep (PackageGraphOptions backend) Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

type Rep (PackageGraphOptions backend) = D1 ('MetaData "PackageGraphOptions" "Development.Guardian.Graph.Adapter.Types" "guardian-0.4.0.0-1i0KmpldsqDJPVBdForgqe" 'False) (C1 ('MetaCons "PackageGraphOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "targetPath") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Path Abs Dir)) :*: (S1 ('MetaSel ('Just "components") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ComponentsOptions) :*: S1 ('MetaSel ('Just "customOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (CustomPackageOptions backend)))))

data ComponentsOptions Source #

Constructors

ComponentsOptions 

Fields

Instances

Instances details
FromJSON ComponentsOptions Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Generic ComponentsOptions Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Associated Types

type Rep ComponentsOptions :: Type -> Type #

Show ComponentsOptions Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Eq ComponentsOptions Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

Ord ComponentsOptions Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

type Rep ComponentsOptions Source # 
Instance details

Defined in Development.Guardian.Graph.Adapter.Types

type Rep ComponentsOptions = D1 ('MetaData "ComponentsOptions" "Development.Guardian.Graph.Adapter.Types" "guardian-0.4.0.0-1i0KmpldsqDJPVBdForgqe" 'False) (C1 ('MetaCons "ComponentsOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "tests") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "benchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))