Hix.NixExpr
indent :: Functor t => Int -> t Text -> t Text Source #
withSemicolon :: NonEmpty Text -> NonEmpty Text Source #
renderAttrs :: Int -> [ExprAttr] -> [Text] Source #
renderExpr :: Int -> Expr -> NonEmpty Text Source #
renderRootExpr :: Expr -> Text Source #
checkEmpty :: Text -> Expr -> ExprAttr Source #
singleOpt :: EncodeNix a => Text -> (e -> Maybe a) -> e -> ExprAttr Source #
single :: EncodeNix a => Text -> (e -> a) -> e -> ExprAttr Source #
multiOpt :: EncodeNix a => Text -> (e -> Maybe [a]) -> e -> ExprAttr Source #
multi :: EncodeNix a => Text -> (e -> [a]) -> e -> ExprAttr Source #
multiOrSingle :: forall a e. EncodeNix a => Text -> (e -> [a]) -> e -> ExprAttr Source #
mkAttrs :: [e -> ExprAttr] -> e -> [ExprAttr] Source #
notNil :: ExprAttr -> Bool Source #
nonEmptyAttrs :: Text -> [ExprAttr] -> ExprAttr Source #