ribosome-app-0.9.9.9: CLI for Ribosome
Safe HaskellSafe-Inferred
LanguageHaskell2010

Ribosome.App.Data

Documentation

newtype ModuleName Source #

Constructors

ModuleName 

Fields

data ProjectNames Source #

Instances

Instances details
Generic ProjectNames Source # 
Instance details

Defined in Ribosome.App.Data

Associated Types

type Rep ProjectNames :: Type -> Type #

Show ProjectNames Source # 
Instance details

Defined in Ribosome.App.Data

Eq ProjectNames Source # 
Instance details

Defined in Ribosome.App.Data

type Rep ProjectNames Source # 
Instance details

Defined in Ribosome.App.Data

type Rep ProjectNames = D1 ('MetaData "ProjectNames" "Ribosome.App.Data" "ribosome-app-0.9.9.9-IYq6tsLCpWSBsbnHBg4igE" 'False) (C1 ('MetaCons "ProjectNames" 'PrefixI 'True) ((S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProjectName) :*: S1 ('MetaSel ('Just "nameDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Rel Dir))) :*: (S1 ('MetaSel ('Just "moduleName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName) :*: S1 ('MetaSel ('Just "moduleNameDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Rel Dir)))))

newtype GithubOrg Source #

Constructors

GithubOrg 

Fields

Instances

Instances details
IsString GithubOrg Source # 
Instance details

Defined in Ribosome.App.Data

Show GithubOrg Source # 
Instance details

Defined in Ribosome.App.Data

Eq GithubOrg Source # 
Instance details

Defined in Ribosome.App.Data

Ord GithubOrg Source # 
Instance details

Defined in Ribosome.App.Data

newtype GithubRepo Source #

Constructors

GithubRepo 

Fields

newtype CachixName Source #

Constructors

CachixName 

Fields

newtype CachixKey Source #

Constructors

CachixKey 

Fields

Instances

Instances details
IsString CachixKey Source # 
Instance details

Defined in Ribosome.App.Data

Show CachixKey Source # 
Instance details

Defined in Ribosome.App.Data

Eq CachixKey Source # 
Instance details

Defined in Ribosome.App.Data

Ord CachixKey Source # 
Instance details

Defined in Ribosome.App.Data

newtype SkipCachix Source #

Constructors

SkipCachix 

Fields

Instances

Instances details
Show SkipCachix Source # 
Instance details

Defined in Ribosome.App.Data

Default SkipCachix Source # 
Instance details

Defined in Ribosome.App.Data

Methods

def :: SkipCachix #

Eq SkipCachix Source # 
Instance details

Defined in Ribosome.App.Data

newtype FlakeUrl Source #

Constructors

FlakeUrl 

Fields

Instances

Instances details
IsString FlakeUrl Source # 
Instance details

Defined in Ribosome.App.Data

Show FlakeUrl Source # 
Instance details

Defined in Ribosome.App.Data

Eq FlakeUrl Source # 
Instance details

Defined in Ribosome.App.Data

Ord FlakeUrl Source # 
Instance details

Defined in Ribosome.App.Data

newtype Branch Source #

Constructors

Branch 

Fields

Instances

Instances details
IsString Branch Source # 
Instance details

Defined in Ribosome.App.Data

Methods

fromString :: String -> Branch #

Show Branch Source # 
Instance details

Defined in Ribosome.App.Data

Eq Branch Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

Ord Branch Source # 
Instance details

Defined in Ribosome.App.Data

newtype Author Source #

Constructors

Author 

Fields

Instances

Instances details
IsString Author Source # 
Instance details

Defined in Ribosome.App.Data

Methods

fromString :: String -> Author #

Show Author Source # 
Instance details

Defined in Ribosome.App.Data

Eq Author Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

Ord Author Source # 
Instance details

Defined in Ribosome.App.Data

newtype Maintainer Source #

Constructors

Maintainer 

Fields

newtype Year Source #

Constructors

Year 

Fields

Instances

Instances details
Enum Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

succ :: Year -> Year #

pred :: Year -> Year #

toEnum :: Int -> Year #

fromEnum :: Year -> Int #

enumFrom :: Year -> [Year] #

enumFromThen :: Year -> Year -> [Year] #

enumFromTo :: Year -> Year -> [Year] #

enumFromThenTo :: Year -> Year -> Year -> [Year] #

Num Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

(+) :: Year -> Year -> Year #

(-) :: Year -> Year -> Year #

(*) :: Year -> Year -> Year #

negate :: Year -> Year #

abs :: Year -> Year #

signum :: Year -> Year #

fromInteger :: Integer -> Year #

Integral Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

quot :: Year -> Year -> Year #

rem :: Year -> Year -> Year #

div :: Year -> Year -> Year #

mod :: Year -> Year -> Year #

quotRem :: Year -> Year -> (Year, Year) #

divMod :: Year -> Year -> (Year, Year) #

toInteger :: Year -> Integer #

Real Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

toRational :: Year -> Rational #

Show Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

showsPrec :: Int -> Year -> ShowS #

show :: Year -> String #

showList :: [Year] -> ShowS #

Eq Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

Ord Year Source # 
Instance details

Defined in Ribosome.App.Data

Methods

compare :: Year -> Year -> Ordering #

(<) :: Year -> Year -> Bool #

(<=) :: Year -> Year -> Bool #

(>) :: Year -> Year -> Bool #

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

max :: Year -> Year -> Year #

min :: Year -> Year -> Year #

newtype PrintDir Source #

Constructors

PrintDir 

Fields

Instances

Instances details
Show PrintDir Source # 
Instance details

Defined in Ribosome.App.Data

Default PrintDir Source # 
Instance details

Defined in Ribosome.App.Data

Methods

def :: PrintDir #

Eq PrintDir Source # 
Instance details

Defined in Ribosome.App.Data

data Github Source #

Constructors

Github 

Fields

Instances

Instances details
Generic Github Source # 
Instance details

Defined in Ribosome.App.Data

Associated Types

type Rep Github :: Type -> Type #

Methods

from :: Github -> Rep Github x #

to :: Rep Github x -> Github #

Show Github Source # 
Instance details

Defined in Ribosome.App.Data

Eq Github Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

type Rep Github Source # 
Instance details

Defined in Ribosome.App.Data

type Rep Github = D1 ('MetaData "Github" "Ribosome.App.Data" "ribosome-app-0.9.9.9-IYq6tsLCpWSBsbnHBg4igE" 'False) (C1 ('MetaCons "Github" 'PrefixI 'True) (S1 ('MetaSel ('Just "org") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GithubOrg) :*: S1 ('MetaSel ('Just "repo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GithubRepo)))

data Cachix Source #

Constructors

Cachix 

Instances

Instances details
Generic Cachix Source # 
Instance details

Defined in Ribosome.App.Data

Associated Types

type Rep Cachix :: Type -> Type #

Methods

from :: Cachix -> Rep Cachix x #

to :: Rep Cachix x -> Cachix #

Show Cachix Source # 
Instance details

Defined in Ribosome.App.Data

Eq Cachix Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

type Rep Cachix Source # 
Instance details

Defined in Ribosome.App.Data

type Rep Cachix = D1 ('MetaData "Cachix" "Ribosome.App.Data" "ribosome-app-0.9.9.9-IYq6tsLCpWSBsbnHBg4igE" 'False) (C1 ('MetaCons "Cachix" 'PrefixI 'True) (S1 ('MetaSel ('Just "cachixName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CachixName) :*: S1 ('MetaSel ('Just "cachixKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CachixKey)))

data Project Source #

Instances

Instances details
Generic Project Source # 
Instance details

Defined in Ribosome.App.Data

Associated Types

type Rep Project :: Type -> Type #

Methods

from :: Project -> Rep Project x #

to :: Rep Project x -> Project #

Show Project Source # 
Instance details

Defined in Ribosome.App.Data

Eq Project Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

type Rep Project Source # 
Instance details

Defined in Ribosome.App.Data

data Global Source #

Constructors

Global 

Fields

Instances

Instances details
Generic Global Source # 
Instance details

Defined in Ribosome.App.Data

Associated Types

type Rep Global :: Type -> Type #

Methods

from :: Global -> Rep Global x #

to :: Rep Global x -> Global #

Show Global Source # 
Instance details

Defined in Ribosome.App.Data

Default Global Source # 
Instance details

Defined in Ribosome.App.Data

Methods

def :: Global #

Eq Global Source # 
Instance details

Defined in Ribosome.App.Data

Methods

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

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

type Rep Global Source # 
Instance details

Defined in Ribosome.App.Data

type Rep Global = D1 ('MetaData "Global" "Ribosome.App.Data" "ribosome-app-0.9.9.9-IYq6tsLCpWSBsbnHBg4igE" 'False) (C1 ('MetaCons "Global" 'PrefixI 'True) (S1 ('MetaSel ('Just "quiet") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "force") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

data NewProject Source #

Instances

Instances details
Generic NewProject Source # 
Instance details

Defined in Ribosome.App.Data

Associated Types

type Rep NewProject :: Type -> Type #

Show NewProject Source # 
Instance details

Defined in Ribosome.App.Data

Eq NewProject Source # 
Instance details

Defined in Ribosome.App.Data

type Rep NewProject Source # 
Instance details

Defined in Ribosome.App.Data