propellor-2.15.4: property-based host configuration management in haskell

Safe HaskellNone
LanguageHaskell98

Propellor

Contents

Description

When propellor runs on a Host, it ensures that its Properties are satisfied, taking action as necessary when a Property is not currently satisfied.

A simple propellor program example:

import Propellor
import qualified Propellor.Property.File as File
import qualified Propellor.Property.Apt as Apt

main :: IO ()
main = defaultMain hosts

hosts :: [Host]
hosts =
  [ host "example.com"
    & Apt.installed ["mydaemon"]
    & "/etc/mydaemon.conf" `File.containsLine` "secure=1"
      `onChange` cmdProperty "service" ["mydaemon", "restart"]
    ! Apt.installed ["unwantedpackage"]
  ]

See config.hs for a more complete example, and clone Propellor's git repository for a deployable system using Propellor: git clone git://git.joeyh.name/propellor

Synopsis

Core data types

data Host Source

Everything Propellor knows about a system: Its hostname, properties and their collected info.

Constructors

Host 

Instances

Show Host Source 
PropAccum Host Source 
Conductable Host Source 
MonadReader Host Propellor Source 
Conductable [Host] Source

Each host in the list will be conducted in turn. Failure to conduct one host does not prevent conducting subsequent hosts in the list, but will be propagated as an overall failure of the property.

data Property i Source

The core data type of Propellor, this represents a property that the system should have, and an action to ensure it has the property.

A property can have associated Info or not. This is tracked at the type level with Property NoInfo and Property HasInfo.

There are many instances and type families, which are mostly used internally, so you needn't worry about them.

data RevertableProperty i Source

A property that can be reverted. The first Property is run normally and the second is run when it's reverted.

Config file

defaultMain :: [Host] -> IO () Source

Runs propellor on hosts, as controlled by command-line options.

host :: HostName -> Host Source

Starts accumulating the properties of a Host.

host "example.com"
	& someproperty
	! oldproperty
	& otherproperty

(&) :: (PropAccum h, IsProp p) => h -> p -> h infixl 1 Source

Adds a property to a Host or other PropAccum

Can add Properties and RevertableProperties

(!) :: IsProp (RevertableProperty i) => PropAccum h => h -> RevertableProperty i -> h infixl 1 Source

Adds a property in reverted form.

Propertries

describe :: IsProp p => p -> Desc -> p Source

Changes the description of a property.

Properties are often combined together in your propellor configuration. For example:

"/etc/foo/config" `File.containsLine` "bar=1"
	`requires` File.dirExists "/etc/foo"

requires :: Combines x y => x -> y -> CombinedType x y Source

Indicates that the first property depends on the second, so before the first is ensured, the second must be ensured.

The combined property uses the description of the first property.

before :: Combines x y => x -> y -> CombinedType x y Source

Combines together two properties, resulting in one property that ensures the first, and if the first succeeds, ensures the second.

The combined property uses the description of the first property.

onChange :: Combines x y => x -> y -> CombinedType x y Source

Whenever a change has to be made for a Property, causes a hook Property to also be run, but not otherwise.

Everything you need to build your own properties, and useful property combinators

Properties to run shell commands

Properties that set Info

Combining a list of properties into a single property

Private data access for properties