ats-pkg-2.0.0.13: Package manager for ATS

Safe HaskellNone
LanguageHaskell2010

Language.ATS.Package

Contents

Synopsis

Documentation

pkgToAction :: [IO ()] -> [String] -> Pkg -> Rules () Source #

build Source #

Arguments

:: [String]

Targets

-> IO () 

Build a set of targets

buildAll :: Maybe FilePath -> IO () Source #

Build in current directory or indicated directory

Types

newtype Version :: * #

Constructors

Version [Integer] 

Instances

Eq Version 

Methods

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

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

Show Version 
Generic Version 

Associated Types

type Rep Version :: * -> * #

Methods

from :: Version -> Rep Version x #

to :: Rep Version x -> Version #

Binary Version 

Methods

put :: Version -> Put #

get :: Get Version #

putList :: [Version] -> Put #

type Rep Version 
type Rep Version = D1 * (MetaData "Version" "Development.Shake.ATS" "shake-ats-0.3.0.6-D6DbJ1EJ5rMFka9zwZsxyo" True) (C1 * (MetaCons "Version" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * [Integer])))

data Pkg Source #

Data type associated with atspkg.dhall file.

Constructors

Pkg 

Fields

Instances

Eq Pkg Source # 

Methods

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

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

Show Pkg Source # 

Methods

showsPrec :: Int -> Pkg -> ShowS #

show :: Pkg -> String #

showList :: [Pkg] -> ShowS #

Generic Pkg Source # 

Associated Types

type Rep Pkg :: * -> * #

Methods

from :: Pkg -> Rep Pkg x #

to :: Rep Pkg x -> Pkg #

Binary Pkg Source # 

Methods

put :: Pkg -> Put #

get :: Get Pkg #

putList :: [Pkg] -> Put #

Interpret Pkg Source # 
type Rep Pkg Source # 

data Bin Source #

Constructors

Bin 

Fields

  • src :: Text

    Source file (should end with .dats)

  • target :: Text

    Binary to be built

  • libs :: [Text]

    Libraries to link against (e.g. [ "pthread" ])

  • hsDeps :: [Text]

    Haskell source files to link against final generated ATS

  • hs2ats :: [TargetPair]

    List of sources and targets for hs2ats

  • gc :: Bool

    Whether to use the garbage collector

data Dependency Source #

Type for a dependency

Constructors

Dependency 

Fields

data TargetPair Source #

This is just a tuple, except I can figure out how to use it with Dhall.

Constructors

TargetPair 

Fields

Lenses