Skip to content
Snippets Groups Projects
Select Git revision
  • 7b94843bb870c8f88991260a94aedd9d95ad3d13
  • master default protected
  • pw-autocomplete-off
  • redis-rate-limits
  • typehints
  • incremental-sync
  • test_instance_path
  • consistent_strings
  • qol_edits
  • v1.2.x
  • v1.x.x
  • v1.1.x
  • feature_invite_validuntil_minmax
  • Dockerfile
  • pylint_disable_consider-using-f-string
  • v1.0.x
  • roles-recursive-cte
  • v2.2.0
  • v2.1.0
  • v2.0.1
  • v2.0.0
  • v1.2.0
  • v1.1.2
  • v1.1.1
  • v1.0.2
  • v1.1.0
  • v1.0.1
  • v1.0.0
  • v0.3.0
  • v0.2.0
  • v0.1.5
  • v0.1.4
  • v0.1.2
33 results

test_rolemod.py

Blame
  • Forked from uffd / uffd
    Source project has a limited visibility.
    Main.hs 4.39 KiB
    {-# LANGUAGE DeriveAnyClass    #-}
    {-# LANGUAGE DeriveGeneric     #-}
    {-# LANGUAGE LambdaCase        #-}
    {-# LANGUAGE NamedFieldPuns    #-}
    {-# LANGUAGE OverloadedStrings #-}
    {-# LANGUAGE MultiWayIf #-}
    
    module Main where
    
    import           Control.Monad            (unless, when)
    import           Control.Monad.Identity   (Identity)
    import           Data.Aeson               (eitherDecode, encode)
    import           Data.Aeson.Encode.Pretty (encodePretty)
    import           Data.Aeson.KeyMap        (coercionToHashMap)
    import qualified Data.ByteString.Lazy     as LB
    import           Data.Maybe               (fromMaybe)
    import qualified Data.Text.Encoding       as T
    import qualified Data.Text.IO             as T
    import           System.Exit              (ExitCode (..), exitWith)
    import           System.IO                (hPutStrLn, stderr)
    import           WithCli                  (Generic, HasArguments, withCli)
    
    import           CheckDir                 (recursiveCheckDir, resultIsFatal, DirResult (dirresultGraph))
    import           Control.Monad            (when)
    import           LintConfig               (LintConfig (..), patchConfig)
    import           Types                    (Level (..))
    import           Util                     (printPretty)
    import           WriteRepo                (writeAdjustedRepository)
    import Text.Dot (showDot)
    
    import qualified Version                  as V (version)
    
    -- | the options this cli tool can take
    data Options = Options
      { repository :: Maybe String
      -- ^ path to the repository containing maps to lint
      , entrypoint :: Maybe String
      -- ^ entrypoint in that repository
      , json       :: Bool
      -- ^ emit json if --json was given
      , lintlevel  :: Maybe Level
      -- ^ maximum lint level to print
      , pretty     :: Bool
      -- ^ pretty-print the json to make it human-readable
      , out        :: Maybe String
      -- ^ path to write the (possibly adjusted) maps to after linting
      , configFile :: Maybe FilePath
      -- ^ path to a config file. Currently required.
      , config     :: Maybe (LintConfig Maybe)
      -- ^ a "patch" for the configuration file
      , version    :: Bool
      , dot        :: Bool
      } deriving (Show, Generic, HasArguments)
    
    
    main :: IO ()
    main = withCli run
    
    run :: Options -> IO ()
    run options = do
      aesonWarning
    
      when (version options) $ do
        putStrLn V.version
        exitWith ExitSuccess
    
      let repo = fromMaybe "." (repository options)
      let entry = fromMaybe "main.json" (entrypoint options)
      let level = fromMaybe Suggestion (lintlevel options)
    
      lintconfig <- case configFile options of
        Nothing -> error "Need a config file!"
        Just path -> LB.readFile path >>= \res ->
          case eitherDecode res :: Either String (LintConfig Identity) of
            Left err   -> error $ "config file invalid: " <> err
            Right file -> pure (patchConfig file (config options))
    
      lints <- recursiveCheckDir lintconfig repo entry
    
      if | dot options ->
           putStrLn (showDot $ dirresultGraph lints)
         | json options ->
           printLB
            $ if pretty options then encodePretty lints else encode lints
         | otherwise -> printPretty (level, lints)
    
      case out options of
        Nothing -> exitWith $ case resultIsFatal lintconfig lints of
          False -> ExitSuccess
          True  -> ExitFailure 1
        Just outpath -> do
          c <- writeAdjustedRepository lintconfig repo outpath lints
          unless (json options) $
            case c of
              ExitFailure 1 -> putStrLn "\nMap failed linting!"
              ExitFailure 2 -> putStrLn "\nOutpath already exists, not writing anything."
              _ -> pure ()
          exitWith c
    
    
    
    
    -- | haskell's many string types are FUN …
    printLB :: LB.ByteString -> IO ()
    printLB a = T.putStrLn $ T.decodeUtf8 $ LB.toStrict a
    
    
    -- if Aesons's internal map and HashMap are the same type, then coercionToHashMap
    -- will contain a proof of that, and we can print a warning. Otherwise we're not
    -- using HashMaps in Aeson and everything is fine.
    --
    -- cf. https://frasertweedale.github.io/blog-fp/posts/2021-10-12-aeson-hash-flooding-protection.html
    aesonWarning :: IO ()
    aesonWarning = case coercionToHashMap of
      Just _ -> hPutStrLn stderr
        "Warning: this program was compiled using an older version of the Aeson Library\n\
        \used for parsing JSON, which is susceptible to hash flooding attacks.\n\
        \n\
        \Recompiling with a newer version is recommended when handling untrusted inputs.\n\
        \n\
        \See https://cs-syd.eu/posts/2021-09-11-json-vulnerability for details."
      _ -> pure ()