propellor/Propellor/Attr.hs

73 lines
2.0 KiB
Haskell
Raw Normal View History

2014-04-11 01:09:20 +00:00
{-# LANGUAGE PackageImports #-}
module Propellor.Attr where
import Propellor.Types
import Propellor.Types.Attr
2014-04-18 21:19:28 +00:00
import Propellor.Types.Dns
2014-04-11 01:09:20 +00:00
import "mtl" Control.Monad.Reader
import qualified Data.Set as S
import qualified Data.Map as M
2014-04-13 06:28:40 +00:00
import Control.Applicative
2014-04-11 01:09:20 +00:00
pureAttrProperty :: Desc -> SetAttr -> Property
pureAttrProperty desc = Property ("has " ++ desc) (return NoChange)
2014-04-11 01:09:20 +00:00
hostname :: HostName -> Property
2014-04-11 01:09:20 +00:00
hostname name = pureAttrProperty ("hostname " ++ name) $
\d -> d { _hostname = name }
getHostName :: Propellor HostName
getHostName = asks _hostname
os :: System -> Property
os system = pureAttrProperty ("Operating " ++ show system) $
\d -> d { _os = Just system }
getOS :: Propellor (Maybe System)
getOS = asks _os
cname :: Domain -> Property
2014-04-18 21:19:28 +00:00
cname domain = pureAttrProperty ("cname " ++ domain)
(addDNS $ CNAME $ AbsDomain domain)
2014-04-11 01:09:20 +00:00
cnameFor :: Domain -> (Domain -> Property) -> Property
2014-04-11 01:09:20 +00:00
cnameFor domain mkp =
let p = mkp domain
2014-04-18 21:19:28 +00:00
in p { propertyAttr = propertyAttr p . addDNS (CNAME $ AbsDomain domain) }
2014-04-11 01:09:20 +00:00
2014-04-18 21:19:28 +00:00
addDNS :: Record -> SetAttr
addDNS record d = d { _dns = S.insert record (_dns d) }
2014-04-11 01:09:20 +00:00
sshPubKey :: String -> Property
2014-04-13 06:28:40 +00:00
sshPubKey k = pureAttrProperty ("ssh pubkey known") $
\d -> d { _sshPubKey = Just k }
getSshPubKey :: Propellor (Maybe String)
getSshPubKey = asks _sshPubKey
2014-04-11 01:09:20 +00:00
hostnameless :: Attr
hostnameless = newAttr (error "hostname Attr not specified")
hostAttr :: Host -> Attr
hostAttr (Host _ mkattrs) = mkattrs hostnameless
hostProperties :: Host -> [Property]
hostProperties (Host ps _) = ps
hostMap :: [Host] -> M.Map HostName Host
hostMap l = M.fromList $ zip (map (_hostname . hostAttr) l) l
findHost :: [Host] -> HostName -> Maybe Host
findHost l hn = M.lookup hn (hostMap l)
2014-04-13 06:28:40 +00:00
-- | Lifts an action into a different host.
--
-- For example, `fromHost hosts "otherhost" getSshPubKey`
fromHost :: [Host] -> HostName -> Propellor a -> Propellor (Maybe a)
fromHost l hn getter = case findHost l hn of
Nothing -> return Nothing
Just h -> liftIO $ Just <$>
runReaderT (runWithAttr getter) (hostAttr h)