module Hadolint.Rule.DL3055 (rule) where import qualified Data.Map as Map import qualified Data.Text as Text import Hadolint.Rule import Language.Docker.Syntax rule :: LabelSchema -> Rule args rule :: forall args. LabelSchema -> Rule args rule LabelSchema labelschema = [Rule args] -> Rule args forall a. Monoid a => [a] -> a mconcat ([Rule args] -> Rule args) -> [Rule args] -> Rule args forall a b. (a -> b) -> a -> b $ (Text -> Rule args) -> [Text] -> [Rule args] forall a b. (a -> b) -> [a] -> [b] forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b fmap Text -> Rule args forall args. Text -> Rule args labelIsNotGitHashRule (LabelSchema -> [Text] forall k a. Map k a -> [k] Map.keys ((LabelType -> Bool) -> LabelSchema -> LabelSchema forall a k. (a -> Bool) -> Map k a -> Map k a Map.filter (LabelType -> LabelType -> Bool forall a. Eq a => a -> a -> Bool == LabelType GitHash) LabelSchema labelschema)) {-# INLINEABLE rule #-} labelIsNotGitHashRule :: LabelName -> Rule args labelIsNotGitHashRule :: forall args. Text -> Rule args labelIsNotGitHashRule Text label = RuleCode -> DLSeverity -> Text -> (Instruction args -> Bool) -> Rule args forall args. RuleCode -> DLSeverity -> Text -> (Instruction args -> Bool) -> Rule args simpleRule RuleCode code DLSeverity severity Text message Instruction args -> Bool forall {args}. Instruction args -> Bool check where code :: RuleCode code = RuleCode "DL3055" severity :: DLSeverity severity = DLSeverity DLWarningC message :: Text message = Text "Label `" Text -> Text -> Text forall a. Semigroup a => a -> a -> a <> Text label Text -> Text -> Text forall a. Semigroup a => a -> a -> a <> Text "` is not a valid git hash." check :: Instruction args -> Bool check (Label Pairs ls) = Pairs -> Bool forall a. [a] -> Bool forall (t :: * -> *) a. Foldable t => t a -> Bool null (Pairs -> Bool) -> Pairs -> Bool forall a b. (a -> b) -> a -> b $ Text -> Pairs -> Pairs getBadHashLabels Text label Pairs ls check Instruction args _ = Bool True getBadHashLabels :: LabelName -> Pairs -> Pairs getBadHashLabels :: Text -> Pairs -> Pairs getBadHashLabels Text lbl Pairs prs = [(Text l, Text v) | (Text l, Text v) <- Pairs prs, Text l Text -> Text -> Bool forall a. Eq a => a -> a -> Bool == Text lbl, Text -> Bool isBadHash Text v] isBadHash :: Text.Text -> Bool isBadHash :: Text -> Bool isBadHash Text h = (Char -> Bool) -> Text -> Bool Text.any (Char -> [Char] -> Bool forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool `notElem` [Char] validHash) Text h Bool -> Bool -> Bool || (Text -> Int Text.length Text h Int -> Int -> Bool forall a. Eq a => a -> a -> Bool /= Int 40 Bool -> Bool -> Bool && Text -> Int Text.length Text h Int -> Int -> Bool forall a. Eq a => a -> a -> Bool /= Int 7) validHash :: String validHash :: [Char] validHash = [Char '0'..Char '9'] [Char] -> [Char] -> [Char] forall a. [a] -> [a] -> [a] ++ [Char 'a'..Char 'f']