ShellCheck-0.7.0/0000755000000000000000000000000013517444075011723 5ustar0000000000000000ShellCheck-0.7.0/shellcheck.hs0000644000000000000000000004631413517444075014374 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} import qualified ShellCheck.Analyzer import ShellCheck.Checker import ShellCheck.Data import ShellCheck.Interface import ShellCheck.Regex import qualified ShellCheck.Formatter.CheckStyle import ShellCheck.Formatter.Format import qualified ShellCheck.Formatter.Diff import qualified ShellCheck.Formatter.GCC import qualified ShellCheck.Formatter.JSON import qualified ShellCheck.Formatter.JSON1 import qualified ShellCheck.Formatter.TTY import qualified ShellCheck.Formatter.Quiet import Control.Exception import Control.Monad import Control.Monad.Except import Data.Bits import Data.Char import Data.Either import Data.Functor import Data.IORef import Data.List import qualified Data.Map as Map import Data.Maybe import Data.Monoid import Data.Semigroup (Semigroup (..)) import Prelude hiding (catch) import System.Console.GetOpt import System.Directory import System.Environment import System.Exit import System.FilePath import System.IO data Flag = Flag String String data Status = NoProblems | SomeProblems | SupportFailure | SyntaxFailure | RuntimeException deriving (Ord, Eq, Show) instance Semigroup Status where (<>) = max instance Monoid Status where mempty = NoProblems mappend = (Data.Semigroup.<>) data Options = Options { checkSpec :: CheckSpec, externalSources :: Bool, sourcePaths :: [FilePath], formatterOptions :: FormatterOptions, minSeverity :: Severity } defaultOptions = Options { checkSpec = emptyCheckSpec, externalSources = False, sourcePaths = [], formatterOptions = newFormatterOptions { foColorOption = ColorAuto }, minSeverity = StyleC } usageHeader = "Usage: shellcheck [OPTIONS...] FILES..." options = [ Option "a" ["check-sourced"] (NoArg $ Flag "sourced" "false") "Include warnings from sourced files", Option "C" ["color"] (OptArg (maybe (Flag "color" "always") (Flag "color")) "WHEN") "Use color (auto, always, never)", Option "i" ["include"] (ReqArg (Flag "include") "CODE1,CODE2..") "Consider only given types of warnings", Option "e" ["exclude"] (ReqArg (Flag "exclude") "CODE1,CODE2..") "Exclude types of warnings", Option "f" ["format"] (ReqArg (Flag "format") "FORMAT") $ "Output format (" ++ formatList ++ ")", Option "" ["list-optional"] (NoArg $ Flag "list-optional" "true") "List checks disabled by default", Option "" ["norc"] (NoArg $ Flag "norc" "true") "Don't look for .shellcheckrc files", Option "o" ["enable"] (ReqArg (Flag "enable") "check1,check2..") "List of optional checks to enable (or 'all')", Option "P" ["source-path"] (ReqArg (Flag "source-path") "SOURCEPATHS") "Specify path when looking for sourced files (\"SCRIPTDIR\" for script's dir)", Option "s" ["shell"] (ReqArg (Flag "shell") "SHELLNAME") "Specify dialect (sh, bash, dash, ksh)", Option "S" ["severity"] (ReqArg (Flag "severity") "SEVERITY") "Minimum severity of errors to consider (error, warning, info, style)", Option "V" ["version"] (NoArg $ Flag "version" "true") "Print version information", Option "W" ["wiki-link-count"] (ReqArg (Flag "wiki-link-count") "NUM") "The number of wiki links to show, when applicable", Option "x" ["external-sources"] (NoArg $ Flag "externals" "true") "Allow 'source' outside of FILES", Option "" ["help"] (NoArg $ Flag "help" "true") "Show this usage summary and exit" ] getUsageInfo = usageInfo usageHeader options printErr = lift . hPutStrLn stderr parseArguments :: [String] -> ExceptT Status IO ([Flag], [FilePath]) parseArguments argv = case getOpt Permute options argv of (opts, files, []) -> return (opts, files) (_, _, errors) -> do printErr $ concat errors ++ "\n" ++ getUsageInfo throwError SyntaxFailure formats :: FormatterOptions -> Map.Map String (IO Formatter) formats options = Map.fromList [ ("checkstyle", ShellCheck.Formatter.CheckStyle.format), ("diff", ShellCheck.Formatter.Diff.format options), ("gcc", ShellCheck.Formatter.GCC.format), ("json", ShellCheck.Formatter.JSON.format), ("json1", ShellCheck.Formatter.JSON1.format), ("tty", ShellCheck.Formatter.TTY.format options), ("quiet", ShellCheck.Formatter.Quiet.format options) ] formatList = intercalate ", " names where names = Map.keys $ formats (formatterOptions defaultOptions) getOption [] _ = Nothing getOption (Flag var val:_) name | name == var = return val getOption (_:rest) flag = getOption rest flag getOptions options name = map (\(Flag _ val) -> val) . filter (\(Flag var _) -> var == name) $ options split char str = split' str [] where split' (a:rest) element = if a == char then reverse element : split' rest [] else split' rest (a:element) split' [] element = [reverse element] toStatus = fmap (either id id) . runExceptT getEnvArgs = do opts <- getEnv "SHELLCHECK_OPTS" `catch` cantWaitForLookupEnv return . filter (not . null) $ opts `splitOn` mkRegex " +" where cantWaitForLookupEnv :: IOException -> IO String cantWaitForLookupEnv = const $ return "" main = do params <- getArgs envOpts <- getEnvArgs let args = envOpts ++ params status <- toStatus $ do (flags, files) <- parseArguments args process flags files exitWith $ statusToCode status statusToCode status = case status of NoProblems -> ExitSuccess SomeProblems -> ExitFailure 1 SyntaxFailure -> ExitFailure 3 SupportFailure -> ExitFailure 4 RuntimeException -> ExitFailure 2 process :: [Flag] -> [FilePath] -> ExceptT Status IO Status process flags files = do options <- foldM (flip parseOption) defaultOptions flags verifyFiles files let format = fromMaybe "tty" $ getOption flags "format" let formatters = formats $ formatterOptions options formatter <- case Map.lookup format formatters of Nothing -> do printErr $ "Unknown format " ++ format printErr "Supported formats:" mapM_ (printErr . write) $ Map.keys formatters throwError SupportFailure where write s = " " ++ s Just f -> ExceptT $ fmap Right f sys <- lift $ ioInterface options files lift $ runFormatter sys formatter options files runFormatter :: SystemInterface IO -> Formatter -> Options -> [FilePath] -> IO Status runFormatter sys format options files = do header format result <- foldM f NoProblems files footer format return result where f :: Status -> FilePath -> IO Status f status file = do newStatus <- process file `catch` handler file return $ status `mappend` newStatus handler :: FilePath -> IOException -> IO Status handler file e = reportFailure file (show e) reportFailure file str = do onFailure format file str return RuntimeException process :: FilePath -> IO Status process filename = do input <- siReadFile sys filename either (reportFailure filename) check input where check contents = do let checkspec = (checkSpec options) { csFilename = filename, csScript = contents } result <- checkScript sys checkspec onResult format result sys return $ if null (crComments result) then NoProblems else SomeProblems parseEnum name value list = case filter ((== value) . fst) list of [(name, value)] -> return value [] -> do printErr $ "Unknown value for --" ++ name ++ ". " ++ "Valid options are: " ++ (intercalate ", " $ map fst list) throwError SupportFailure parseColorOption value = parseEnum "color" value [ ("auto", ColorAuto), ("always", ColorAlways), ("never", ColorNever) ] parseSeverityOption value = parseEnum "severity" value [ ("error", ErrorC), ("warning", WarningC), ("info", InfoC), ("style", StyleC) ] parseOption flag options = case flag of Flag "shell" str -> fromMaybe (die $ "Unknown shell: " ++ str) $ do shell <- shellForExecutable str return $ return options { checkSpec = (checkSpec options) { csShellTypeOverride = Just shell } } Flag "exclude" str -> do new <- mapM parseNum $ filter (not . null) $ split ',' str let old = csExcludedWarnings . checkSpec $ options return options { checkSpec = (checkSpec options) { csExcludedWarnings = new ++ old } } Flag "include" str -> do new <- mapM parseNum $ filter (not . null) $ split ',' str let old = csIncludedWarnings . checkSpec $ options return options { checkSpec = (checkSpec options) { csIncludedWarnings = if null new then old else Just new `mappend` old } } Flag "version" _ -> do liftIO printVersion throwError NoProblems Flag "list-optional" _ -> do liftIO printOptional throwError NoProblems Flag "help" _ -> do liftIO $ putStrLn getUsageInfo throwError NoProblems Flag "externals" _ -> return options { externalSources = True } Flag "color" color -> do option <- parseColorOption color return options { formatterOptions = (formatterOptions options) { foColorOption = option } } Flag "source-path" str -> do let paths = splitSearchPath str return options { sourcePaths = (sourcePaths options) ++ paths } Flag "sourced" _ -> return options { checkSpec = (checkSpec options) { csCheckSourced = True } } Flag "severity" severity -> do option <- parseSeverityOption severity return options { checkSpec = (checkSpec options) { csMinSeverity = option } } Flag "wiki-link-count" countString -> do count <- parseNum countString return options { formatterOptions = (formatterOptions options) { foWikiLinkCount = count } } Flag "norc" _ -> return options { checkSpec = (checkSpec options) { csIgnoreRC = True } } Flag "enable" value -> let cs = checkSpec options in return options { checkSpec = cs { csOptionalChecks = (csOptionalChecks cs) ++ split ',' value } } -- This flag is handled specially in 'process' Flag "format" _ -> return options Flag str _ -> do printErr $ "Internal error for --" ++ str ++ ". Please file a bug :(" return options where die s = do printErr s throwError SupportFailure parseNum ('S':'C':str) = parseNum str parseNum num = do unless (all isDigit num) $ do printErr $ "Invalid number: " ++ num throwError SyntaxFailure return (Prelude.read num :: Integer) ioInterface options files = do inputs <- mapM normalize files cache <- newIORef emptyCache configCache <- newIORef ("", Nothing) return SystemInterface { siReadFile = get cache inputs, siFindSource = findSourceFile inputs (sourcePaths options), siGetConfig = getConfig configCache } where emptyCache :: Map.Map FilePath String emptyCache = Map.empty get cache inputs file = do map <- readIORef cache case Map.lookup file map of Just x -> return $ Right x Nothing -> fetch cache inputs file fetch cache inputs file = do ok <- allowable inputs file if ok then (do (contents, shouldCache) <- inputFile file when shouldCache $ modifyIORef cache $ Map.insert file contents return $ Right contents ) `catch` handler else return $ Left (file ++ " was not specified as input (see shellcheck -x).") where handler :: IOException -> IO (Either ErrorMessage String) handler ex = return . Left $ show ex allowable inputs x = if externalSources options then return True else do path <- normalize x return $ path `elem` inputs normalize x = canonicalizePath x `catch` fallback x where fallback :: FilePath -> IOException -> IO FilePath fallback path _ = return path -- Returns the name and contents of .shellcheckrc for the given file getConfig cache filename = do path <- normalize filename let dir = takeDirectory path (previousPath, result) <- readIORef cache if dir == previousPath then return result else do paths <- getConfigPaths dir result <- findConfig paths writeIORef cache (dir, result) return result findConfig paths = case paths of (file:rest) -> do contents <- readConfig file if isJust contents then return contents else findConfig rest [] -> return Nothing -- Get a list of candidate filenames. This includes .shellcheckrc -- in all parent directories, plus the user's home dir and xdg dir. -- The dot is optional for Windows and Snap users. getConfigPaths dir = do let next = takeDirectory dir rest <- if next /= dir then getConfigPaths next else defaultPaths `catch` ((const $ return []) :: IOException -> IO [FilePath]) return $ (dir ".shellcheckrc") : (dir "shellcheckrc") : rest defaultPaths = do home <- getAppUserDataDirectory "shellcheckrc" xdg <- getXdgDirectory XdgConfig "shellcheckrc" return [home, xdg] readConfig file = do exists <- doesFileExist file if exists then do (contents, _) <- inputFile file `catch` handler file return $ Just (file, contents) else return Nothing where handler :: FilePath -> IOException -> IO (String, Bool) handler file err = do putStrLn $ file ++ ": " ++ show err return ("", True) andM a b arg = do first <- a arg if not first then return False else b arg findSourceFile inputs sourcePathFlag currentScript sourcePathAnnotation original = if isAbsolute original then let (_, relative) = splitDrive original in find relative original else find original original where find filename deflt = do sources <- filterM ((allowable inputs) `andM` doesFileExist) $ (adjustPath filename):(map ( filename) $ map adjustPath $ sourcePathFlag ++ sourcePathAnnotation) case sources of [] -> return deflt (first:_) -> return first scriptdir = dropFileName currentScript adjustPath str = case (splitDirectories str) of ("SCRIPTDIR":rest) -> joinPath (scriptdir:rest) _ -> str inputFile file = do (handle, shouldCache) <- if file == "-" then return (stdin, True) else do h <- openBinaryFile file ReadMode reopenable <- hIsSeekable h return (h, not reopenable) hSetBinaryMode handle True contents <- decodeString <$> hGetContents handle -- closes handle seq (length contents) $ return (contents, shouldCache) -- Decode a char8 string into a utf8 string, with fallback on -- ISO-8859-1. This avoids depending on additional libraries. decodeString = decode where decode [] = [] decode (c:rest) | isAscii c = c : decode rest decode (c:rest) = let num = (fromIntegral $ ord c) :: Int next = case num of _ | num >= 0xF8 -> Nothing | num >= 0xF0 -> construct (num .&. 0x07) 3 rest | num >= 0xE0 -> construct (num .&. 0x0F) 2 rest | num >= 0xC0 -> construct (num .&. 0x1F) 1 rest | True -> Nothing in case next of Just (n, remainder) -> chr n : decode remainder Nothing -> c : decode rest construct x 0 rest = do guard $ x <= 0x10FFFF return (x, rest) construct x n (c:rest) = let num = (fromIntegral $ ord c) :: Int in if num >= 0x80 && num <= 0xBF then construct ((x `shiftL` 6) .|. (num .&. 0x3f)) (n-1) rest else Nothing construct _ _ _ = Nothing verifyFiles files = when (null files) $ do printErr "No files specified.\n" printErr $ usageInfo usageHeader options throwError SyntaxFailure printVersion = do putStrLn "ShellCheck - shell script analysis tool" putStrLn $ "version: " ++ shellcheckVersion putStrLn "license: GNU General Public License, version 3" putStrLn "website: https://www.shellcheck.net" printOptional = do mapM f list where list = sortOn cdName ShellCheck.Analyzer.optionalChecks f item = do putStrLn $ "name: " ++ cdName item putStrLn $ "desc: " ++ cdDescription item putStrLn $ "example: " ++ cdPositive item putStrLn $ "fix: " ++ cdNegative item putStrLn "" ShellCheck-0.7.0/LICENSE0000644000000000000000000010517413517444075012740 0ustar0000000000000000Employer mandated disclaimer: I am providing code in the repository to you under an open source license. Because this is my personal repository, the license you receive to my code is from me and other individual contributors, and not my employer (Facebook). - Vidar "koala_man" Holen ---- GNU GENERAL PUBLIC LICENSE Version 3, 29 June 2007 Copyright (C) 2007 Free Software Foundation, Inc. Everyone is permitted to copy and distribute verbatim copies of this license document, but changing it is not allowed. Preamble The GNU General Public License is a free, copyleft license for software and other kinds of works. The licenses for most software and other practical works are designed to take away your freedom to share and change the works. By contrast, the GNU General Public License is intended to guarantee your freedom to share and change all versions of a program--to make sure it remains free software for all its users. We, the Free Software Foundation, use the GNU General Public License for most of our software; it applies also to any other work released this way by its authors. You can apply it to your programs, too. When we speak of free software, we are referring to freedom, not price. Our General Public Licenses are designed to make sure that you have the freedom to distribute copies of free software (and charge for them if you wish), that you receive source code or can get it if you want it, that you can change the software or use pieces of it in new free programs, and that you know you can do these things. To protect your rights, we need to prevent others from denying you these rights or asking you to surrender the rights. Therefore, you have certain responsibilities if you distribute copies of the software, or if you modify it: responsibilities to respect the freedom of others. For example, if you distribute copies of such a program, whether gratis or for a fee, you must pass on to the recipients the same freedoms that you received. You must make sure that they, too, receive or can get the source code. And you must show them these terms so they know their rights. Developers that use the GNU GPL protect your rights with two steps: (1) assert copyright on the software, and (2) offer you this License giving you legal permission to copy, distribute and/or modify it. For the developers' and authors' protection, the GPL clearly explains that there is no warranty for this free software. For both users' and authors' sake, the GPL requires that modified versions be marked as changed, so that their problems will not be attributed erroneously to authors of previous versions. Some devices are designed to deny users access to install or run modified versions of the software inside them, although the manufacturer can do so. This is fundamentally incompatible with the aim of protecting users' freedom to change the software. The systematic pattern of such abuse occurs in the area of products for individuals to use, which is precisely where it is most unacceptable. Therefore, we have designed this version of the GPL to prohibit the practice for those products. If such problems arise substantially in other domains, we stand ready to extend this provision to those domains in future versions of the GPL, as needed to protect the freedom of users. Finally, every program is threatened constantly by software patents. States should not allow patents to restrict development and use of software on general-purpose computers, but in those that do, we wish to avoid the special danger that patents applied to a free program could make it effectively proprietary. To prevent this, the GPL assures that patents cannot be used to render the program non-free. The precise terms and conditions for copying, distribution and modification follow. TERMS AND CONDITIONS 0. Definitions. "This License" refers to version 3 of the GNU General Public License. "Copyright" also means copyright-like laws that apply to other kinds of works, such as semiconductor masks. "The Program" refers to any copyrightable work licensed under this License. Each licensee is addressed as "you". "Licensees" and "recipients" may be individuals or organizations. To "modify" a work means to copy from or adapt all or part of the work in a fashion requiring copyright permission, other than the making of an exact copy. The resulting work is called a "modified version" of the earlier work or a work "based on" the earlier work. A "covered work" means either the unmodified Program or a work based on the Program. To "propagate" a work means to do anything with it that, without permission, would make you directly or secondarily liable for infringement under applicable copyright law, except executing it on a computer or modifying a private copy. Propagation includes copying, distribution (with or without modification), making available to the public, and in some countries other activities as well. To "convey" a work means any kind of propagation that enables other parties to make or receive copies. Mere interaction with a user through a computer network, with no transfer of a copy, is not conveying. An interactive user interface displays "Appropriate Legal Notices" to the extent that it includes a convenient and prominently visible feature that (1) displays an appropriate copyright notice, and (2) tells the user that there is no warranty for the work (except to the extent that warranties are provided), that licensees may convey the work under this License, and how to view a copy of this License. If the interface presents a list of user commands or options, such as a menu, a prominent item in the list meets this criterion. 1. Source Code. The "source code" for a work means the preferred form of the work for making modifications to it. "Object code" means any non-source form of a work. A "Standard Interface" means an interface that either is an official standard defined by a recognized standards body, or, in the case of interfaces specified for a particular programming language, one that is widely used among developers working in that language. The "System Libraries" of an executable work include anything, other than the work as a whole, that (a) is included in the normal form of packaging a Major Component, but which is not part of that Major Component, and (b) serves only to enable use of the work with that Major Component, or to implement a Standard Interface for which an implementation is available to the public in source code form. A "Major Component", in this context, means a major essential component (kernel, window system, and so on) of the specific operating system (if any) on which the executable work runs, or a compiler used to produce the work, or an object code interpreter used to run it. The "Corresponding Source" for a work in object code form means all the source code needed to generate, install, and (for an executable work) run the object code and to modify the work, including scripts to control those activities. However, it does not include the work's System Libraries, or general-purpose tools or generally available free programs which are used unmodified in performing those activities but which are not part of the work. For example, Corresponding Source includes interface definition files associated with source files for the work, and the source code for shared libraries and dynamically linked subprograms that the work is specifically designed to require, such as by intimate data communication or control flow between those subprograms and other parts of the work. The Corresponding Source need not include anything that users can regenerate automatically from other parts of the Corresponding Source. The Corresponding Source for a work in source code form is that same work. 2. Basic Permissions. All rights granted under this License are granted for the term of copyright on the Program, and are irrevocable provided the stated conditions are met. This License explicitly affirms your unlimited permission to run the unmodified Program. The output from running a covered work is covered by this License only if the output, given its content, constitutes a covered work. This License acknowledges your rights of fair use or other equivalent, as provided by copyright law. You may make, run and propagate covered works that you do not convey, without conditions so long as your license otherwise remains in force. You may convey covered works to others for the sole purpose of having them make modifications exclusively for you, or provide you with facilities for running those works, provided that you comply with the terms of this License in conveying all material for which you do not control copyright. Those thus making or running the covered works for you must do so exclusively on your behalf, under your direction and control, on terms that prohibit them from making any copies of your copyrighted material outside their relationship with you. Conveying under any other circumstances is permitted solely under the conditions stated below. Sublicensing is not allowed; section 10 makes it unnecessary. 3. Protecting Users' Legal Rights From Anti-Circumvention Law. No covered work shall be deemed part of an effective technological measure under any applicable law fulfilling obligations under article 11 of the WIPO copyright treaty adopted on 20 December 1996, or similar laws prohibiting or restricting circumvention of such measures. When you convey a covered work, you waive any legal power to forbid circumvention of technological measures to the extent such circumvention is effected by exercising rights under this License with respect to the covered work, and you disclaim any intention to limit operation or modification of the work as a means of enforcing, against the work's users, your or third parties' legal rights to forbid circumvention of technological measures. 4. Conveying Verbatim Copies. You may convey verbatim copies of the Program's source code as you receive it, in any medium, provided that you conspicuously and appropriately publish on each copy an appropriate copyright notice; keep intact all notices stating that this License and any non-permissive terms added in accord with section 7 apply to the code; keep intact all notices of the absence of any warranty; and give all recipients a copy of this License along with the Program. You may charge any price or no price for each copy that you convey, and you may offer support or warranty protection for a fee. 5. Conveying Modified Source Versions. You may convey a work based on the Program, or the modifications to produce it from the Program, in the form of source code under the terms of section 4, provided that you also meet all of these conditions: a) The work must carry prominent notices stating that you modified it, and giving a relevant date. b) The work must carry prominent notices stating that it is released under this License and any conditions added under section 7. This requirement modifies the requirement in section 4 to "keep intact all notices". c) You must license the entire work, as a whole, under this License to anyone who comes into possession of a copy. This License will therefore apply, along with any applicable section 7 additional terms, to the whole of the work, and all its parts, regardless of how they are packaged. This License gives no permission to license the work in any other way, but it does not invalidate such permission if you have separately received it. d) If the work has interactive user interfaces, each must display Appropriate Legal Notices; however, if the Program has interactive interfaces that do not display Appropriate Legal Notices, your work need not make them do so. A compilation of a covered work with other separate and independent works, which are not by their nature extensions of the covered work, and which are not combined with it such as to form a larger program, in or on a volume of a storage or distribution medium, is called an "aggregate" if the compilation and its resulting copyright are not used to limit the access or legal rights of the compilation's users beyond what the individual works permit. Inclusion of a covered work in an aggregate does not cause this License to apply to the other parts of the aggregate. 6. Conveying Non-Source Forms. You may convey a covered work in object code form under the terms of sections 4 and 5, provided that you also convey the machine-readable Corresponding Source under the terms of this License, in one of these ways: a) Convey the object code in, or embodied in, a physical product (including a physical distribution medium), accompanied by the Corresponding Source fixed on a durable physical medium customarily used for software interchange. b) Convey the object code in, or embodied in, a physical product (including a physical distribution medium), accompanied by a written offer, valid for at least three years and valid for as long as you offer spare parts or customer support for that product model, to give anyone who possesses the object code either (1) a copy of the Corresponding Source for all the software in the product that is covered by this License, on a durable physical medium customarily used for software interchange, for a price no more than your reasonable cost of physically performing this conveying of source, or (2) access to copy the Corresponding Source from a network server at no charge. c) Convey individual copies of the object code with a copy of the written offer to provide the Corresponding Source. This alternative is allowed only occasionally and noncommercially, and only if you received the object code with such an offer, in accord with subsection 6b. d) Convey the object code by offering access from a designated place (gratis or for a charge), and offer equivalent access to the Corresponding Source in the same way through the same place at no further charge. You need not require recipients to copy the Corresponding Source along with the object code. If the place to copy the object code is a network server, the Corresponding Source may be on a different server (operated by you or a third party) that supports equivalent copying facilities, provided you maintain clear directions next to the object code saying where to find the Corresponding Source. Regardless of what server hosts the Corresponding Source, you remain obligated to ensure that it is available for as long as needed to satisfy these requirements. e) Convey the object code using peer-to-peer transmission, provided you inform other peers where the object code and Corresponding Source of the work are being offered to the general public at no charge under subsection 6d. A separable portion of the object code, whose source code is excluded from the Corresponding Source as a System Library, need not be included in conveying the object code work. A "User Product" is either (1) a "consumer product", which means any tangible personal property which is normally used for personal, family, or household purposes, or (2) anything designed or sold for incorporation into a dwelling. In determining whether a product is a consumer product, doubtful cases shall be resolved in favor of coverage. For a particular product received by a particular user, "normally used" refers to a typical or common use of that class of product, regardless of the status of the particular user or of the way in which the particular user actually uses, or expects or is expected to use, the product. A product is a consumer product regardless of whether the product has substantial commercial, industrial or non-consumer uses, unless such uses represent the only significant mode of use of the product. "Installation Information" for a User Product means any methods, procedures, authorization keys, or other information required to install and execute modified versions of a covered work in that User Product from a modified version of its Corresponding Source. The information must suffice to ensure that the continued functioning of the modified object code is in no case prevented or interfered with solely because modification has been made. If you convey an object code work under this section in, or with, or specifically for use in, a User Product, and the conveying occurs as part of a transaction in which the right of possession and use of the User Product is transferred to the recipient in perpetuity or for a fixed term (regardless of how the transaction is characterized), the Corresponding Source conveyed under this section must be accompanied by the Installation Information. But this requirement does not apply if neither you nor any third party retains the ability to install modified object code on the User Product (for example, the work has been installed in ROM). The requirement to provide Installation Information does not include a requirement to continue to provide support service, warranty, or updates for a work that has been modified or installed by the recipient, or for the User Product in which it has been modified or installed. Access to a network may be denied when the modification itself materially and adversely affects the operation of the network or violates the rules and protocols for communication across the network. Corresponding Source conveyed, and Installation Information provided, in accord with this section must be in a format that is publicly documented (and with an implementation available to the public in source code form), and must require no special password or key for unpacking, reading or copying. 7. Additional Terms. "Additional permissions" are terms that supplement the terms of this License by making exceptions from one or more of its conditions. Additional permissions that are applicable to the entire Program shall be treated as though they were included in this License, to the extent that they are valid under applicable law. If additional permissions apply only to part of the Program, that part may be used separately under those permissions, but the entire Program remains governed by this License without regard to the additional permissions. When you convey a copy of a covered work, you may at your option remove any additional permissions from that copy, or from any part of it. (Additional permissions may be written to require their own removal in certain cases when you modify the work.) You may place additional permissions on material, added by you to a covered work, for which you have or can give appropriate copyright permission. Notwithstanding any other provision of this License, for material you add to a covered work, you may (if authorized by the copyright holders of that material) supplement the terms of this License with terms: a) Disclaiming warranty or limiting liability differently from the terms of sections 15 and 16 of this License; or b) Requiring preservation of specified reasonable legal notices or author attributions in that material or in the Appropriate Legal Notices displayed by works containing it; or c) Prohibiting misrepresentation of the origin of that material, or requiring that modified versions of such material be marked in reasonable ways as different from the original version; or d) Limiting the use for publicity purposes of names of licensors or authors of the material; or e) Declining to grant rights under trademark law for use of some trade names, trademarks, or service marks; or f) Requiring indemnification of licensors and authors of that material by anyone who conveys the material (or modified versions of it) with contractual assumptions of liability to the recipient, for any liability that these contractual assumptions directly impose on those licensors and authors. All other non-permissive additional terms are considered "further restrictions" within the meaning of section 10. If the Program as you received it, or any part of it, contains a notice stating that it is governed by this License along with a term that is a further restriction, you may remove that term. If a license document contains a further restriction but permits relicensing or conveying under this License, you may add to a covered work material governed by the terms of that license document, provided that the further restriction does not survive such relicensing or conveying. If you add terms to a covered work in accord with this section, you must place, in the relevant source files, a statement of the additional terms that apply to those files, or a notice indicating where to find the applicable terms. Additional terms, permissive or non-permissive, may be stated in the form of a separately written license, or stated as exceptions; the above requirements apply either way. 8. Termination. You may not propagate or modify a covered work except as expressly provided under this License. Any attempt otherwise to propagate or modify it is void, and will automatically terminate your rights under this License (including any patent licenses granted under the third paragraph of section 11). However, if you cease all violation of this License, then your license from a particular copyright holder is reinstated (a) provisionally, unless and until the copyright holder explicitly and finally terminates your license, and (b) permanently, if the copyright holder fails to notify you of the violation by some reasonable means prior to 60 days after the cessation. Moreover, your license from a particular copyright holder is reinstated permanently if the copyright holder notifies you of the violation by some reasonable means, this is the first time you have received notice of violation of this License (for any work) from that copyright holder, and you cure the violation prior to 30 days after your receipt of the notice. Termination of your rights under this section does not terminate the licenses of parties who have received copies or rights from you under this License. If your rights have been terminated and not permanently reinstated, you do not qualify to receive new licenses for the same material under section 10. 9. Acceptance Not Required for Having Copies. You are not required to accept this License in order to receive or run a copy of the Program. Ancillary propagation of a covered work occurring solely as a consequence of using peer-to-peer transmission to receive a copy likewise does not require acceptance. However, nothing other than this License grants you permission to propagate or modify any covered work. These actions infringe copyright if you do not accept this License. Therefore, by modifying or propagating a covered work, you indicate your acceptance of this License to do so. 10. Automatic Licensing of Downstream Recipients. Each time you convey a covered work, the recipient automatically receives a license from the original licensors, to run, modify and propagate that work, subject to this License. You are not responsible for enforcing compliance by third parties with this License. An "entity transaction" is a transaction transferring control of an organization, or substantially all assets of one, or subdividing an organization, or merging organizations. If propagation of a covered work results from an entity transaction, each party to that transaction who receives a copy of the work also receives whatever licenses to the work the party's predecessor in interest had or could give under the previous paragraph, plus a right to possession of the Corresponding Source of the work from the predecessor in interest, if the predecessor has it or can get it with reasonable efforts. You may not impose any further restrictions on the exercise of the rights granted or affirmed under this License. For example, you may not impose a license fee, royalty, or other charge for exercise of rights granted under this License, and you may not initiate litigation (including a cross-claim or counterclaim in a lawsuit) alleging that any patent claim is infringed by making, using, selling, offering for sale, or importing the Program or any portion of it. 11. Patents. A "contributor" is a copyright holder who authorizes use under this License of the Program or a work on which the Program is based. The work thus licensed is called the contributor's "contributor version". A contributor's "essential patent claims" are all patent claims owned or controlled by the contributor, whether already acquired or hereafter acquired, that would be infringed by some manner, permitted by this License, of making, using, or selling its contributor version, but do not include claims that would be infringed only as a consequence of further modification of the contributor version. For purposes of this definition, "control" includes the right to grant patent sublicenses in a manner consistent with the requirements of this License. Each contributor grants you a non-exclusive, worldwide, royalty-free patent license under the contributor's essential patent claims, to make, use, sell, offer for sale, import and otherwise run, modify and propagate the contents of its contributor version. In the following three paragraphs, a "patent license" is any express agreement or commitment, however denominated, not to enforce a patent (such as an express permission to practice a patent or covenant not to sue for patent infringement). To "grant" such a patent license to a party means to make such an agreement or commitment not to enforce a patent against the party. If you convey a covered work, knowingly relying on a patent license, and the Corresponding Source of the work is not available for anyone to copy, free of charge and under the terms of this License, through a publicly available network server or other readily accessible means, then you must either (1) cause the Corresponding Source to be so available, or (2) arrange to deprive yourself of the benefit of the patent license for this particular work, or (3) arrange, in a manner consistent with the requirements of this License, to extend the patent license to downstream recipients. "Knowingly relying" means you have actual knowledge that, but for the patent license, your conveying the covered work in a country, or your recipient's use of the covered work in a country, would infringe one or more identifiable patents in that country that you have reason to believe are valid. If, pursuant to or in connection with a single transaction or arrangement, you convey, or propagate by procuring conveyance of, a covered work, and grant a patent license to some of the parties receiving the covered work authorizing them to use, propagate, modify or convey a specific copy of the covered work, then the patent license you grant is automatically extended to all recipients of the covered work and works based on it. A patent license is "discriminatory" if it does not include within the scope of its coverage, prohibits the exercise of, or is conditioned on the non-exercise of one or more of the rights that are specifically granted under this License. You may not convey a covered work if you are a party to an arrangement with a third party that is in the business of distributing software, under which you make payment to the third party based on the extent of your activity of conveying the work, and under which the third party grants, to any of the parties who would receive the covered work from you, a discriminatory patent license (a) in connection with copies of the covered work conveyed by you (or copies made from those copies), or (b) primarily for and in connection with specific products or compilations that contain the covered work, unless you entered into that arrangement, or that patent license was granted, prior to 28 March 2007. Nothing in this License shall be construed as excluding or limiting any implied license or other defenses to infringement that may otherwise be available to you under applicable patent law. 12. No Surrender of Others' Freedom. If conditions are imposed on you (whether by court order, agreement or otherwise) that contradict the conditions of this License, they do not excuse you from the conditions of this License. If you cannot convey a covered work so as to satisfy simultaneously your obligations under this License and any other pertinent obligations, then as a consequence you may not convey it at all. For example, if you agree to terms that obligate you to collect a royalty for further conveying from those to whom you convey the Program, the only way you could satisfy both those terms and this License would be to refrain entirely from conveying the Program. 13. Use with the GNU Affero General Public License. Notwithstanding any other provision of this License, you have permission to link or combine any covered work with a work licensed under version 3 of the GNU Affero General Public License into a single combined work, and to convey the resulting work. The terms of this License will continue to apply to the part which is the covered work, but the special requirements of the GNU Affero General Public License, section 13, concerning interaction through a network will apply to the combination as such. 14. Revised Versions of this License. The Free Software Foundation may publish revised and/or new versions of the GNU General Public License from time to time. Such new versions will be similar in spirit to the present version, but may differ in detail to address new problems or concerns. Each version is given a distinguishing version number. If the Program specifies that a certain numbered version of the GNU General Public License "or any later version" applies to it, you have the option of following the terms and conditions either of that numbered version or of any later version published by the Free Software Foundation. If the Program does not specify a version number of the GNU General Public License, you may choose any version ever published by the Free Software Foundation. If the Program specifies that a proxy can decide which future versions of the GNU General Public License can be used, that proxy's public statement of acceptance of a version permanently authorizes you to choose that version for the Program. Later license versions may give you additional or different permissions. However, no additional obligations are imposed on any author or copyright holder as a result of your choosing to follow a later version. 15. Disclaimer of Warranty. THERE IS NO WARRANTY FOR THE PROGRAM, TO THE EXTENT PERMITTED BY APPLICABLE LAW. EXCEPT WHEN OTHERWISE STATED IN WRITING THE COPYRIGHT HOLDERS AND/OR OTHER PARTIES PROVIDE THE PROGRAM "AS IS" WITHOUT WARRANTY OF ANY KIND, EITHER EXPRESSED OR IMPLIED, INCLUDING, BUT NOT LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE. THE ENTIRE RISK AS TO THE QUALITY AND PERFORMANCE OF THE PROGRAM IS WITH YOU. SHOULD THE PROGRAM PROVE DEFECTIVE, YOU ASSUME THE COST OF ALL NECESSARY SERVICING, REPAIR OR CORRECTION. 16. Limitation of Liability. IN NO EVENT UNLESS REQUIRED BY APPLICABLE LAW OR AGREED TO IN WRITING WILL ANY COPYRIGHT HOLDER, OR ANY OTHER PARTY WHO MODIFIES AND/OR CONVEYS THE PROGRAM AS PERMITTED ABOVE, BE LIABLE TO YOU FOR DAMAGES, INCLUDING ANY GENERAL, SPECIAL, INCIDENTAL OR CONSEQUENTIAL DAMAGES ARISING OUT OF THE USE OR INABILITY TO USE THE PROGRAM (INCLUDING BUT NOT LIMITED TO LOSS OF DATA OR DATA BEING RENDERED INACCURATE OR LOSSES SUSTAINED BY YOU OR THIRD PARTIES OR A FAILURE OF THE PROGRAM TO OPERATE WITH ANY OTHER PROGRAMS), EVEN IF SUCH HOLDER OR OTHER PARTY HAS BEEN ADVISED OF THE POSSIBILITY OF SUCH DAMAGES. 17. Interpretation of Sections 15 and 16. If the disclaimer of warranty and limitation of liability provided above cannot be given local legal effect according to their terms, reviewing courts shall apply local law that most closely approximates an absolute waiver of all civil liability in connection with the Program, unless a warranty or assumption of liability accompanies a copy of the Program in return for a fee. END OF TERMS AND CONDITIONS How to Apply These Terms to Your New Programs If you develop a new program, and you want it to be of the greatest possible use to the public, the best way to achieve this is to make it free software which everyone can redistribute and change under these terms. To do so, attach the following notices to the program. It is safest to attach them to the start of each source file to most effectively state the exclusion of warranty; and each file should have at least the "copyright" line and a pointer to where the full notice is found. Copyright (C) This program is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. This program is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . Also add information on how to contact you by electronic and paper mail. If the program does terminal interaction, make it output a short notice like this when it starts in an interactive mode: Copyright (C) This program comes with ABSOLUTELY NO WARRANTY; for details type `show w'. This is free software, and you are welcome to redistribute it under certain conditions; type `show c' for details. The hypothetical commands `show w' and `show c' should show the appropriate parts of the General Public License. Of course, your program's commands might be different; for a GUI interface, you would use an "about box". You should also get your employer (if you work as a programmer) or school, if any, to sign a "copyright disclaimer" for the program, if necessary. For more information on this, and how to apply and follow the GNU GPL, see . The GNU General Public License does not permit incorporating your program into proprietary programs. If your program is a subroutine library, you may consider it more useful to permit linking proprietary applications with the library. If this is what you want to do, use the GNU Lesser General Public License instead of this License. But first, please read . ShellCheck-0.7.0/Setup.hs0000644000000000000000000000225213517444075013360 0ustar0000000000000000import Distribution.PackageDescription ( HookedBuildInfo, emptyHookedBuildInfo ) import Distribution.Simple ( Args, UserHooks ( preSDist ), defaultMainWithHooks, simpleUserHooks ) import Distribution.Simple.Setup ( SDistFlags ) import System.Process ( system ) main = defaultMainWithHooks myHooks where myHooks = simpleUserHooks { preSDist = myPreSDist } -- | This hook will be executed before e.g. @cabal sdist@. It runs -- pandoc to create the man page from shellcheck.1.md. If the pandoc -- command is not found, this will fail with an error message: -- -- /bin/sh: pandoc: command not found -- -- Since the man page is listed in the Extra-Source-Files section of -- our cabal file, a failure here should result in a failure to -- create the distribution tarball (that's a good thing). -- myPreSDist :: Args -> SDistFlags -> IO HookedBuildInfo myPreSDist _ _ = do putStrLn "Building the man page (shellcheck.1) with pandoc..." putStrLn pandoc_cmd result <- system pandoc_cmd putStrLn $ "pandoc exited with " ++ show result return emptyHookedBuildInfo where pandoc_cmd = "pandoc -s -f markdown-smart -t man shellcheck.1.md -o shellcheck.1" ShellCheck-0.7.0/ShellCheck.cabal0000644000000000000000000000652213517444075014721 0ustar0000000000000000Name: ShellCheck Version: 0.7.0 Synopsis: Shell script analysis tool License: GPL-3 License-file: LICENSE Category: Static Analysis Author: Vidar Holen Maintainer: vidar@vidarholen.net Homepage: https://www.shellcheck.net/ Build-Type: Custom Cabal-Version: >= 1.8 Bug-reports: https://github.com/koalaman/shellcheck/issues Description: The goals of ShellCheck are: . * To point out and clarify typical beginner's syntax issues, that causes a shell to give cryptic error messages. . * To point out and clarify typical intermediate level semantic problems, that causes a shell to behave strangely and counter-intuitively. . * To point out subtle caveats, corner cases and pitfalls, that may cause an advanced user's otherwise working script to fail under future circumstances. Extra-Source-Files: -- documentation README.md shellcheck.1.md -- built with a cabal sdist hook shellcheck.1 -- convenience script for stripping tests striptests -- tests test/shellcheck.hs custom-setup setup-depends: base >= 4 && <5, process >= 1.0 && <1.7, Cabal >= 1.10 && <2.5 source-repository head type: git location: git://github.com/koalaman/shellcheck.git library hs-source-dirs: src if impl(ghc < 8.0) build-depends: semigroups build-depends: aeson, array, -- GHC 7.6.3 (base 4.6.0.1) is buggy (#1131, #1119) in optimized mode. -- Just disable that version entirely to fail fast. base > 4.6.0.1 && < 5, bytestring, containers >= 0.5, deepseq >= 1.4.0.0, Diff >= 0.2.0, directory >= 1.2.3.0, mtl >= 2.2.1, filepath, parsec, regex-tdfa, QuickCheck >= 2.7.4, -- When cabal supports it, move this to setup-depends: process exposed-modules: ShellCheck.AST ShellCheck.ASTLib ShellCheck.Analytics ShellCheck.Analyzer ShellCheck.AnalyzerLib ShellCheck.Checker ShellCheck.Checks.Commands ShellCheck.Checks.Custom ShellCheck.Checks.ShellSupport ShellCheck.Data ShellCheck.Fixer ShellCheck.Formatter.Format ShellCheck.Formatter.CheckStyle ShellCheck.Formatter.Diff ShellCheck.Formatter.GCC ShellCheck.Formatter.JSON ShellCheck.Formatter.JSON1 ShellCheck.Formatter.TTY ShellCheck.Formatter.Quiet ShellCheck.Interface ShellCheck.Parser ShellCheck.Regex other-modules: Paths_ShellCheck executable shellcheck if impl(ghc < 8.0) build-depends: semigroups build-depends: aeson, array, base >= 4 && < 5, bytestring, containers, deepseq >= 1.4.0.0, Diff >= 0.2.0, directory >= 1.2.3.0, mtl >= 2.2.1, filepath, parsec >= 3.0, QuickCheck >= 2.7.4, regex-tdfa, ShellCheck main-is: shellcheck.hs test-suite test-shellcheck type: exitcode-stdio-1.0 build-depends: aeson, array, base >= 4 && < 5, bytestring, containers, deepseq >= 1.4.0.0, Diff >= 0.2.0, directory >= 1.2.3.0, mtl >= 2.2.1, filepath, parsec, QuickCheck >= 2.7.4, regex-tdfa, ShellCheck main-is: test/shellcheck.hs ShellCheck-0.7.0/README.md0000644000000000000000000004430013517444075013203 0ustar0000000000000000[![Build Status](https://travis-ci.org/koalaman/shellcheck.svg?branch=master)](https://travis-ci.org/koalaman/shellcheck) # ShellCheck - A shell script static analysis tool ShellCheck is a GPLv3 tool that gives warnings and suggestions for bash/sh shell scripts: ![Screenshot of a terminal showing problematic shell script lines highlighted](doc/terminal.png) The goals of ShellCheck are * To point out and clarify typical beginner's syntax issues that cause a shell to give cryptic error messages. * To point out and clarify typical intermediate level semantic problems that cause a shell to behave strangely and counter-intuitively. * To point out subtle caveats, corner cases and pitfalls that may cause an advanced user's otherwise working script to fail under future circumstances. See [the gallery of bad code](README.md#user-content-gallery-of-bad-code) for examples of what ShellCheck can help you identify! ## Table of Contents * [How to use](#how-to-use) * [On the web](#on-the-web) * [From your terminal](#from-your-terminal) * [In your editor](#in-your-editor) * [In your build or test suites](#in-your-build-or-test-suites) * [Installing](#installing) * [Compiling from source](#compiling-from-source) * [Installing Cabal](#installing-cabal) * [Compiling ShellCheck](#compiling-shellcheck) * [Running tests](#running-tests) * [Gallery of bad code](#gallery-of-bad-code) * [Quoting](#quoting) * [Conditionals](#conditionals) * [Frequently misused commands](#frequently-misused-commands) * [Common beginner's mistakes](#common-beginners-mistakes) * [Style](#style) * [Data and typing errors](#data-and-typing-errors) * [Robustness](#robustness) * [Portability](#portability) * [Miscellaneous](#miscellaneous) * [Testimonials](#testimonials) * [Ignoring issues](#ignoring-issues) * [Reporting bugs](#reporting-bugs) * [Contributing](#contributing) * [Copyright](#copyright) * [Other Resources](#other-resources) ## How to use There are a number of ways to use ShellCheck! ### On the web Paste a shell script on for instant feedback. [ShellCheck.net](https://www.shellcheck.net) is always synchronized to the latest git commit, and is the easiest way to give ShellCheck a go. Tell your friends! ### From your terminal Run `shellcheck yourscript` in your terminal for instant output, as seen above. ### In your editor You can see ShellCheck suggestions directly in a variety of editors. * Vim, through [ALE](https://github.com/w0rp/ale), [Neomake](https://github.com/neomake/neomake), or [Syntastic](https://github.com/scrooloose/syntastic): ![Screenshot of Vim showing inlined shellcheck feedback](doc/vim-syntastic.png). * Emacs, through [Flycheck](https://github.com/flycheck/flycheck) or [Flymake](https://github.com/federicotdn/flymake-shellcheck): ![Screenshot of emacs showing inlined shellcheck feedback](doc/emacs-flycheck.png). * Sublime, through [SublimeLinter](https://github.com/SublimeLinter/SublimeLinter-shellcheck). * Atom, through [Linter](https://github.com/AtomLinter/linter-shellcheck). * VSCode, through [vscode-shellcheck](https://github.com/timonwong/vscode-shellcheck). * Most other editors, through [GCC error compatibility](shellcheck.1.md#user-content-formats). ### In your build or test suites While ShellCheck is mostly intended for interactive use, it can easily be added to builds or test suites. It makes canonical use of exit codes, so you can just add a `shellcheck` command as part of the process. For example, in a Makefile: ```Makefile check-scripts: # Fail if any of these files have warnings shellcheck myscripts/*.sh ``` or in a Travis CI `.travis.yml` file: ```yaml script: # Fail if any of these files have warnings - shellcheck myscripts/*.sh ``` Services and platforms that have ShellCheck pre-installed and ready to use: * [Travis CI](https://travis-ci.org/) * [Codacy](https://www.codacy.com/) * [Code Climate](https://codeclimate.com/) * [Code Factor](https://www.codefactor.io/) Services and platforms with third party plugins: * [SonarQube](https://www.sonarqube.org/) through [sonar-shellcheck-plugin](https://github.com/emerald-squad/sonar-shellcheck-plugin) Most other services, including [GitLab](https://about.gitlab.com/), let you install ShellCheck yourself, either through the system's package manager (see [Installing](#installing)), or by downloading and unpacking a [binary release](#installing-the-shellcheck-binary). It's a good idea to manually install a specific ShellCheck version regardless. This avoids any surprise build breaks when a new version with new warnings is published. For customized filtering or reporting, ShellCheck can output simple JSON, CheckStyle compatible XML, GCC compatible warnings as well as human readable text (with or without ANSI colors). See the [Integration](https://github.com/koalaman/shellcheck/wiki/Integration) wiki page for more documentation. ## Installing The easiest way to install ShellCheck locally is through your package manager. On systems with Cabal (installs to `~/.cabal/bin`): cabal update cabal install ShellCheck On systems with Stack (installs to `~/.local/bin`): stack update stack install ShellCheck On Debian based distros: apt-get install shellcheck On Arch Linux based distros: pacman -S shellcheck or get the dependency free [shellcheck-static](https://aur.archlinux.org/packages/shellcheck-static/) from the AUR. On Gentoo based distros: emerge --ask shellcheck On EPEL based distros: yum -y install epel-release yum install ShellCheck On Fedora based distros: dnf install ShellCheck On FreeBSD: pkg install hs-ShellCheck On OS X with homebrew: brew install shellcheck On OpenBSD: pkg_add shellcheck On openSUSE zypper in ShellCheck Or use OneClickInstall - On Solus: eopkg install shellcheck On Windows (via [chocolatey](https://chocolatey.org/packages/shellcheck)): ```cmd C:\> choco install shellcheck ``` Or Windows (via [scoop](http://scoop.sh)): ```cmd C:\> scoop install shellcheck ``` From Snap Store: snap install --channel=edge shellcheck From Docker Hub: ```sh docker run --rm -v "$PWD:/mnt" koalaman/shellcheck:stable myscript # Or :v0.4.7 for that version, or :latest for daily builds ``` or use `koalaman/shellcheck-alpine` if you want a larger Alpine Linux based image to extend. It works exactly like a regular Alpine image, but has shellcheck preinstalled. Alternatively, you can download pre-compiled binaries for the latest release here: * [Linux, x86_64](https://storage.googleapis.com/shellcheck/shellcheck-stable.linux.x86_64.tar.xz) (statically linked) * [Linux, armv6hf](https://storage.googleapis.com/shellcheck/shellcheck-stable.linux.armv6hf.tar.xz), i.e. Raspberry Pi (statically linked) * [Linux, aarch64](https://storage.googleapis.com/shellcheck/shellcheck-stable.linux.armv6hf.tar.xz) aka ARM64 (statically linked) * [MacOS, x86_64](https://shellcheck.storage.googleapis.com/shellcheck-stable.darwin.x86_64.tar.xz) * [Windows, x86](https://storage.googleapis.com/shellcheck/shellcheck-stable.zip) or see the [storage bucket listing](https://shellcheck.storage.googleapis.com/index.html) for checksums, older versions and the latest daily builds. Distro packages already come with a `man` page. If you are building from source, it can be installed with: ```console pandoc -s -f markdown-smart -t man shellcheck.1.md -o shellcheck.1 sudo mv shellcheck.1 /usr/share/man/man1 ``` ### Travis CI Travis CI has now integrated ShellCheck by default, so you don't need to manually install it. If you still want to do so in order to upgrade at your leisure or ensure you're using the latest release, follow the steps below to install a binary version. ### Installing a pre-compiled binary The pre-compiled binaries come in `tar.xz` files. To decompress them, make sure `xz` is installed. On Debian/Ubuntu/Mint, you can `apt install xz-utils`. On Redhat/Fedora/CentOS, `yum -y install xz`. A simple installer may do something like: ```bash scversion="stable" # or "v0.4.7", or "latest" wget -qO- "https://storage.googleapis.com/shellcheck/shellcheck-${scversion?}.linux.x86_64.tar.xz" | tar -xJv cp "shellcheck-${scversion}/shellcheck" /usr/bin/ shellcheck --version ``` ## Compiling from source This section describes how to build ShellCheck from a source directory. ShellCheck is written in Haskell and requires 2GB of RAM to compile. ### Installing Cabal ShellCheck is built and packaged using Cabal. Install the package `cabal-install` from your system's package manager (with e.g. `apt-get`, `brew`, `emerge`, `yum`, or `zypper`). On MacOS (OS X), you can do a fast install of Cabal using brew, which takes a couple of minutes instead of more than 30 minutes if you try to compile it from source. $ brew install cabal-install On MacPorts, the package is instead called `hs-cabal-install`, while native Windows users should install the latest version of the Haskell platform from Verify that `cabal` is installed and update its dependency list with $ cabal update ### Compiling ShellCheck `git clone` this repository, and `cd` to the ShellCheck source directory to build/install: $ cabal install Or if you intend to run the tests: $ cabal install --enable-tests This will compile ShellCheck and install it to your `~/.cabal/bin` directory. Add this directory to your `PATH` (for bash, add this to your `~/.bashrc`): ```sh export PATH="$HOME/.cabal/bin:$PATH" ``` Log out and in again, and verify that your PATH is set up correctly: ```sh $ which shellcheck ~/.cabal/bin/shellcheck ``` On native Windows, the `PATH` should already be set up, but the system may use a legacy codepage. In `cmd.exe`, `powershell.exe` and Powershell ISE, make sure to use a TrueType font, not a Raster font, and set the active codepage to UTF-8 (65001) with `chcp`: ```cmd chcp 65001 ``` In Powershell ISE, you may need to additionally update the output encoding: ```powershell [Console]::OutputEncoding = [System.Text.Encoding]::UTF8 ``` ### Running tests To run the unit test suite: $ cabal test ## Gallery of bad code So what kind of things does ShellCheck look for? Here is an incomplete list of detected issues. ### Quoting ShellCheck can recognize several types of incorrect quoting: ```sh echo $1 # Unquoted variables find . -name *.ogg # Unquoted find/grep patterns rm "~/my file.txt" # Quoted tilde expansion v='--verbose="true"'; cmd $v # Literal quotes in variables for f in "*.ogg" # Incorrectly quoted 'for' loops touch $@ # Unquoted $@ echo 'Don't forget to restart!' # Singlequote closed by apostrophe echo 'Don\'t try this at home' # Attempting to escape ' in '' echo 'Path is $PATH' # Variables in single quotes trap "echo Took ${SECONDS}s" 0 # Prematurely expanded trap ``` ### Conditionals ShellCheck can recognize many types of incorrect test statements. ```sh [[ n != 0 ]] # Constant test expressions [[ -e *.mpg ]] # Existence checks of globs [[ $foo==0 ]] # Always true due to missing spaces [[ -n "$foo " ]] # Always true due to literals [[ $foo =~ "fo+" ]] # Quoted regex in =~ [ foo =~ re ] # Unsupported [ ] operators [ $1 -eq "shellcheck" ] # Numerical comparison of strings [ $n && $m ] # && in [ .. ] [ grep -q foo file ] # Command without $(..) [[ "$$file" == *.jpg ]] # Comparisons that can't succeed (( 1 -lt 2 )) # Using test operators in ((..)) ``` ### Frequently misused commands ShellCheck can recognize instances where commands are used incorrectly: ```sh grep '*foo*' file # Globs in regex contexts find . -exec foo {} && bar {} \; # Prematurely terminated find -exec sudo echo 'Var=42' > /etc/profile # Redirecting sudo time --format=%s sleep 10 # Passing time(1) flags to time builtin while read h; do ssh "$h" uptime # Commands eating while loop input alias archive='mv $1 /backup' # Defining aliases with arguments tr -cd '[a-zA-Z0-9]' # [] around ranges in tr exec foo; echo "Done!" # Misused 'exec' find -name \*.bak -o -name \*~ -delete # Implicit precedence in find # find . -exec foo > bar \; # Redirections in find f() { whoami; }; sudo f # External use of internal functions ``` ### Common beginner's mistakes ShellCheck recognizes many common beginner's syntax errors: ```sh var = 42 # Spaces around = in assignments $foo=42 # $ in assignments for $var in *; do ... # $ in for loop variables var$n="Hello" # Wrong indirect assignment echo ${var$n} # Wrong indirect reference var=(1, 2, 3) # Comma separated arrays array=( [index] = value ) # Incorrect index initialization echo $var[14] # Missing {} in array references echo "Argument 10 is $10" # Positional parameter misreference if $(myfunction); then ..; fi # Wrapping commands in $() else if othercondition; then .. # Using 'else if' f; f() { echo "hello world; } # Using function before definition [ false ] # 'false' being true if ( -f file ) # Using (..) instead of test ``` ### Style ShellCheck can make suggestions to improve style: ```sh [[ -z $(find /tmp | grep mpg) ]] # Use grep -q instead a >> log; b >> log; c >> log # Use a redirection block instead echo "The time is `date`" # Use $() instead cd dir; process *; cd ..; # Use subshells instead echo $[1+2] # Use standard $((..)) instead of old $[] echo $(($RANDOM % 6)) # Don't use $ on variables in $((..)) echo "$(date)" # Useless use of echo cat file | grep foo # Useless use of cat ``` ### Data and typing errors ShellCheck can recognize issues related to data and typing: ```sh args="$@" # Assigning arrays to strings files=(foo bar); echo "$files" # Referencing arrays as strings declare -A arr=(foo bar) # Associative arrays without index printf "%s\n" "Arguments: $@." # Concatenating strings and arrays [[ $# > 2 ]] # Comparing numbers as strings var=World; echo "Hello " var # Unused lowercase variables echo "Hello $name" # Unassigned lowercase variables cmd | read bar; echo $bar # Assignments in subshells cat foo | cp bar # Piping to commands that don't read printf '%s: %s\n' foo # Mismatches in printf argument count ``` ### Robustness ShellCheck can make suggestions for improving the robustness of a script: ```sh rm -rf "$STEAMROOT/"* # Catastrophic rm touch ./-l; ls * # Globs that could become options find . -exec sh -c 'a && b {}' \; # Find -exec shell injection printf "Hello $name" # Variables in printf format for f in $(ls *.txt); do # Iterating over ls output export MYVAR=$(cmd) # Masked exit codes case $version in 2.*) :;; 2.6.*) # Shadowed case branches ``` ### Portability ShellCheck will warn when using features not supported by the shebang. For example, if you set the shebang to `#!/bin/sh`, ShellCheck will warn about portability issues similar to `checkbashisms`: ```sh echo {1..$n} # Works in ksh, but not bash/dash/sh echo {1..10} # Works in ksh and bash, but not dash/sh echo -n 42 # Works in ksh, bash and dash, undefined in sh trap 'exit 42' sigint # Unportable signal spec cmd &> file # Unportable redirection operator read foo < /dev/tcp/host/22 # Unportable intercepted files foo-bar() { ..; } # Undefined/unsupported function name [ $UID = 0 ] # Variable undefined in dash/sh local var=value # local is undefined in sh time sleep 1 | sleep 5 # Undefined uses of 'time' ``` ### Miscellaneous ShellCheck recognizes a menagerie of other issues: ```sh PS1='\e[0;32m\$\e[0m ' # PS1 colors not in \[..\] PATH="$PATH:~/bin" # Literal tilde in $PATH rm “file” # Unicode quotes echo "Hello world" # Carriage return / DOS line endings echo hello \ # Trailing spaces after \ var=42 echo $var # Expansion of inlined environment #!/bin/bash -x -e # Common shebang errors echo $((n/180*100)) # Unnecessary loss of precision ls *[:digit:].txt # Bad character class globs sed 's/foo/bar/' file > file # Redirecting to input while getopts "a" f; do case $f in "b") # Unhandled getopts flags ``` ## Testimonials > At first you're like "shellcheck is awesome" but then you're like "wtf are we still using bash" Alexander Tarasikov, [via Twitter](https://twitter.com/astarasikov/status/568825996532707330) ## Ignoring issues Issues can be ignored via environmental variable, command line, individually or globally within a file: ## Reporting bugs Please use the GitHub issue tracker for any bugs or feature suggestions: ## Contributing Please submit patches to code or documentation as GitHub pull requests! Check out the [DevGuide](https://github.com/koalaman/shellcheck/wiki/DevGuide) on the ShellCheck Wiki. Contributions must be licensed under the GNU GPLv3. The contributor retains the copyright. ## Copyright ShellCheck is licensed under the GNU General Public License, v3. A copy of this license is included in the file [LICENSE](LICENSE). Copyright 2012-2019, [Vidar 'koala_man' Holen](https://github.com/koalaman/) and contributors. Happy ShellChecking! ## Other Resources * The wiki has [long form descriptions](https://github.com/koalaman/shellcheck/wiki/Checks) for each warning, e.g. [SC2221](https://github.com/koalaman/shellcheck/wiki/SC2221). * ShellCheck does not attempt to enforce any kind of formatting or indenting style, so also check out [shfmt](https://github.com/mvdan/sh)! ShellCheck-0.7.0/shellcheck.1.md0000644000000000000000000002535513517444075014523 0ustar0000000000000000% SHELLCHECK(1) Shell script analysis tool # NAME shellcheck - Shell script analysis tool # SYNOPSIS **shellcheck** [*OPTIONS*...] *FILES*... # DESCRIPTION ShellCheck is a static analysis and linting tool for sh/bash scripts. It's mainly focused on handling typical beginner and intermediate level syntax errors and pitfalls where the shell just gives a cryptic error message or strange behavior, but it also reports on a few more advanced issues where corner cases can cause delayed failures. ShellCheck gives shell specific advice. Consider this line: (( area = 3.14*r*r )) + For scripts starting with `#!/bin/sh` (or when using `-s sh`), ShellCheck will warn that `(( .. ))` is not POSIX compliant (similar to checkbashisms). + For scripts starting with `#!/bin/bash` (or using `-s bash`), ShellCheck will warn that decimals are not supported. + For scripts starting with `#!/bin/ksh` (or using `-s ksh`), ShellCheck will not warn at all, as `ksh` supports decimals in arithmetic contexts. # OPTIONS **-a**,\ **--check-sourced** : Emit warnings in sourced files. Normally, `shellcheck` will only warn about issues in the specified files. With this option, any issues in sourced files will also be reported. **-C**[*WHEN*],\ **--color**[=*WHEN*] : For TTY output, enable colors *always*, *never* or *auto*. The default is *auto*. **--color** without an argument is equivalent to **--color=always**. **-i**\ *CODE1*[,*CODE2*...],\ **--include=***CODE1*[,*CODE2*...] : Explicitly include only the specified codes in the report. Subsequent **-i** options are cumulative, but all the codes can be specified at once, comma-separated as a single argument. Include options override any provided exclude options. **-e**\ *CODE1*[,*CODE2*...],\ **--exclude=***CODE1*[,*CODE2*...] : Explicitly exclude the specified codes from the report. Subsequent **-e** options are cumulative, but all the codes can be specified at once, comma-separated as a single argument. **-f** *FORMAT*, **--format=***FORMAT* : Specify the output format of shellcheck, which prints its results in the standard output. Subsequent **-f** options are ignored, see **FORMATS** below for more information. **--list-optional** : Output a list of known optional checks. These can be enabled with **-o** flags or **enable** directives. **--norc** : Don't try to look for .shellcheckrc configuration files. **-o**\ *NAME1*[,*NAME2*...],\ **--enable=***NAME1*[,*NAME2*...] : Enable optional checks. The special name *all* enables all of them. Subsequent **-o** options accumulate. This is equivalent to specifying **enable** directives. **-P**\ *SOURCEPATH*,\ **--source-path=***SOURCEPATH* : Specify paths to search for sourced files, separated by `:` on Unix and `;` on Windows. This is equivalent to specifying `search-path` directives. **-s**\ *shell*,\ **--shell=***shell* : Specify Bourne shell dialect. Valid values are *sh*, *bash*, *dash* and *ksh*. The default is to deduce the shell from the file's `shell` directive, shebang, or `.bash/.bats/.dash/.ksh` extension, in that order. *sh* refers to POSIX `sh` (not the system's), and will warn of portability issues. **-S**\ *SEVERITY*,\ **--severity=***severity* : Specify minimum severity of errors to consider. Valid values in order of severity are *error*, *warning*, *info* and *style*. The default is *style*. **-V**,\ **--version** : Print version information and exit. **-W** *NUM*,\ **--wiki-link-count=NUM** : For TTY output, show *NUM* wiki links to more information about mentioned warnings. Set to 0 to disable them entirely. **-x**,\ **--external-sources** : Follow 'source' statements even when the file is not specified as input. By default, `shellcheck` will only follow files specified on the command line (plus `/dev/null`). This option allows following any file the script may `source`. **FILES...** : One or more script files to check, or "-" for standard input. # FORMATS **tty** : Plain text, human readable output. This is the default. **gcc** : GCC compatible output. Useful for editors that support compiling and showing syntax errors. For example, in Vim, `:set makeprg=shellcheck\ -f\ gcc\ %` will allow using `:make` to check the script, and `:cnext` to jump to the next error. ::: : **checkstyle** : Checkstyle compatible XML output. Supported directly or through plugins by many IDEs and build monitoring systems. ... ... **diff** : Auto-fixes in unified diff format. Can be piped to `git apply` or `patch -p1` to automatically apply fixes. --- a/test.sh +++ b/test.sh @@ -2,6 +2,6 @@ ## Example of a broken script. for f in $(ls *.m3u) do - grep -qi hq.*mp3 $f \ + grep -qi hq.*mp3 "$f" \ && echo -e 'Playlist $f contains a HQ file in mp3 format' done **json1** : Json is a popular serialization format that is more suitable for web applications. ShellCheck's json is compact and contains only the bare minimum. Tabs are counted as 1 character. { comments: [ { "file": "filename", "line": lineNumber, "column": columnNumber, "level": "severitylevel", "code": errorCode, "message": "warning message" }, ... ] } **json** : This is a legacy version of the **json1** format. It's a raw array of comments, and all offsets have a tab stop of 8. **quiet** : Suppress all normal output. Exit with zero if no issues are found, otherwise exit with one. Stops processing after the first issue. # DIRECTIVES ShellCheck directives can be specified as comments in the shell script. If they appear before the first command, they are considered file-wide. Otherwise, they apply to the immediately following command or block: # shellcheck key=value key=value command-or-structure For example, to suppress SC2035 about using `./*.jpg`: # shellcheck disable=SC2035 echo "Files: " *.jpg To tell ShellCheck where to look for an otherwise dynamically determined file: # shellcheck source=./lib.sh source "$(find_install_dir)/lib.sh" Here a shell brace group is used to suppress a warning on multiple lines: # shellcheck disable=SC2016 { echo 'Modifying $PATH' echo 'PATH=foo:$PATH' >> ~/.bashrc } Valid keys are: **disable** : Disables a comma separated list of error codes for the following command. The command can be a simple command like `echo foo`, or a compound command like a function definition, subshell block or loop. **enable** : Enable an optional check by name, as listed with **--list-optional**. Only file-wide `enable` directives are considered. **source** : Overrides the filename included by a `source`/`.` statement. This can be used to tell shellcheck where to look for a file whose name is determined at runtime, or to skip a source by telling it to use `/dev/null`. **source-path** : Add a directory to the search path for `source`/`.` statements (by default, only ShellCheck's working directory is included). Absolute paths will also be rooted in these paths. The special path `SCRIPTDIR` can be used to specify the currently checked script's directory, as in `source-path=SCRIPTDIR` or `source-path=SCRIPTDIR/../libs`. Multiple paths accumulate, and `-P` takes precedence over them. **shell** : Overrides the shell detected from the shebang. This is useful for files meant to be included (and thus lacking a shebang), or possibly as a more targeted alternative to 'disable=2039'. # RC FILES Unless `--norc` is used, ShellCheck will look for a file `.shellcheckrc` or `shellcheckrc` in the script's directory and each parent directory. If found, it will read `key=value` pairs from it and treat them as file-wide directives. Here is an example `.shellcheckrc`: # Look for 'source'd files relative to the checked script, # and also look for absolute paths in /mnt/chroot source-path=SCRIPTDIR source-path=/mnt/chroot # Turn on warnings for unquoted variables with safe values enable=quote-safe-variables # Turn on warnings for unassigned uppercase variables enable=check-unassigned-uppercase # Allow using `which` since it gives full paths and is common enough disable=SC2230 If no `.shellcheckrc` is found in any of the parent directories, ShellCheck will look in `~/.shellcheckrc` followed by the XDG config directory (usually `~/.config/shellcheckrc`) on Unix, or `%APPDATA%/shellcheckrc` on Windows. Only the first file found will be used. Note for Snap users: the Snap sandbox disallows access to hidden files. Use `shellcheckrc` without the dot instead. Note for Docker users: ShellCheck will only be able to look for files that are mounted in the container, so `~/.shellcheckrc` will not be read. # ENVIRONMENT VARIABLES The environment variable `SHELLCHECK_OPTS` can be set with default flags: export SHELLCHECK_OPTS='--shell=bash --exclude=SC2016' Its value will be split on spaces and prepended to the command line on each invocation. # RETURN VALUES ShellCheck uses the follow exit codes: + 0: All files successfully scanned with no issues. + 1: All files successfully scanned with some issues. + 2: Some files could not be processed (e.g. file not found). + 3: ShellCheck was invoked with bad syntax (e.g. unknown flag). + 4: ShellCheck was invoked with bad options (e.g. unknown formatter). # LOCALE This version of ShellCheck is only available in English. All files are leniently decoded as UTF-8, with a fallback of ISO-8859-1 for invalid sequences. `LC_CTYPE` is respected for output, and defaults to UTF-8 for locales where encoding is unspecified (such as the `C` locale). Windows users seeing `commitBuffer: invalid argument (invalid character)` should set their terminal to use UTF-8 with `chcp 65001`. # AUTHORS ShellCheck is developed and maintained by Vidar Holen, with assistance from a long list of wonderful contributors. # REPORTING BUGS Bugs and issues can be reported on GitHub: https://github.com/koalaman/shellcheck/issues # COPYRIGHT Copyright 2012-2019, Vidar Holen and contributors. Licensed under the GNU General Public License version 3 or later, see https://gnu.org/licenses/gpl.html # SEE ALSO sh(1) bash(1) ShellCheck-0.7.0/shellcheck.10000644000000000000000000003043613517444075014120 0ustar0000000000000000.\" Automatically generated by Pandoc 2.2.1 .\" .TH "SHELLCHECK" "1" "" "Shell script analysis tool" "" .hy .SH NAME .PP shellcheck \- Shell script analysis tool .SH SYNOPSIS .PP \f[B]shellcheck\f[] [\f[I]OPTIONS\f[]...] \f[I]FILES\f[]... .SH DESCRIPTION .PP ShellCheck is a static analysis and linting tool for sh/bash scripts. It\[aq]s mainly focused on handling typical beginner and intermediate level syntax errors and pitfalls where the shell just gives a cryptic error message or strange behavior, but it also reports on a few more advanced issues where corner cases can cause delayed failures. .PP ShellCheck gives shell specific advice. Consider this line: .IP .nf \f[C] ((\ area\ =\ 3.14*r*r\ )) \f[] .fi .IP \[bu] 2 For scripts starting with \f[C]#!/bin/sh\f[] (or when using \f[C]\-s\ sh\f[]), ShellCheck will warn that \f[C]((\ ..\ ))\f[] is not POSIX compliant (similar to checkbashisms). .IP \[bu] 2 For scripts starting with \f[C]#!/bin/bash\f[] (or using \f[C]\-s\ bash\f[]), ShellCheck will warn that decimals are not supported. .IP \[bu] 2 For scripts starting with \f[C]#!/bin/ksh\f[] (or using \f[C]\-s\ ksh\f[]), ShellCheck will not warn at all, as \f[C]ksh\f[] supports decimals in arithmetic contexts. .SH OPTIONS .TP .B \f[B]\-a\f[],\ \f[B]\-\-check\-sourced\f[] Emit warnings in sourced files. Normally, \f[C]shellcheck\f[] will only warn about issues in the specified files. With this option, any issues in sourced files will also be reported. .RS .RE .TP .B \f[B]\-C\f[][\f[I]WHEN\f[]],\ \f[B]\-\-color\f[][=\f[I]WHEN\f[]] For TTY output, enable colors \f[I]always\f[], \f[I]never\f[] or \f[I]auto\f[]. The default is \f[I]auto\f[]. \f[B]\-\-color\f[] without an argument is equivalent to \f[B]\-\-color=always\f[]. .RS .RE .TP .B \f[B]\-i\f[]\ \f[I]CODE1\f[][,\f[I]CODE2\f[]...],\ \f[B]\-\-include=\f[]\f[I]CODE1\f[][,\f[I]CODE2\f[]...] Explicitly include only the specified codes in the report. Subsequent \f[B]\-i\f[] options are cumulative, but all the codes can be specified at once, comma\-separated as a single argument. Include options override any provided exclude options. .RS .RE .TP .B \f[B]\-e\f[]\ \f[I]CODE1\f[][,\f[I]CODE2\f[]...],\ \f[B]\-\-exclude=\f[]\f[I]CODE1\f[][,\f[I]CODE2\f[]...] Explicitly exclude the specified codes from the report. Subsequent \f[B]\-e\f[] options are cumulative, but all the codes can be specified at once, comma\-separated as a single argument. .RS .RE .TP .B \f[B]\-f\f[] \f[I]FORMAT\f[], \f[B]\-\-format=\f[]\f[I]FORMAT\f[] Specify the output format of shellcheck, which prints its results in the standard output. Subsequent \f[B]\-f\f[] options are ignored, see \f[B]FORMATS\f[] below for more information. .RS .RE .TP .B \f[B]\-\-list\-optional\f[] Output a list of known optional checks. These can be enabled with \f[B]\-o\f[] flags or \f[B]enable\f[] directives. .RS .RE .TP .B \f[B]\-\-norc\f[] Don\[aq]t try to look for .shellcheckrc configuration files. .RS .RE .TP .B \f[B]\-o\f[]\ \f[I]NAME1\f[][,\f[I]NAME2\f[]...],\ \f[B]\-\-enable=\f[]\f[I]NAME1\f[][,\f[I]NAME2\f[]...] Enable optional checks. The special name \f[I]all\f[] enables all of them. Subsequent \f[B]\-o\f[] options accumulate. This is equivalent to specifying \f[B]enable\f[] directives. .RS .RE .TP .B \f[B]\-P\f[]\ \f[I]SOURCEPATH\f[],\ \f[B]\-\-source\-path=\f[]\f[I]SOURCEPATH\f[] Specify paths to search for sourced files, separated by \f[C]:\f[] on Unix and \f[C];\f[] on Windows. This is equivalent to specifying \f[C]search\-path\f[] directives. .RS .RE .TP .B \f[B]\-s\f[]\ \f[I]shell\f[],\ \f[B]\-\-shell=\f[]\f[I]shell\f[] Specify Bourne shell dialect. Valid values are \f[I]sh\f[], \f[I]bash\f[], \f[I]dash\f[] and \f[I]ksh\f[]. The default is to deduce the shell from the file\[aq]s \f[C]shell\f[] directive, shebang, or \f[C]\&.bash/.bats/.dash/.ksh\f[] extension, in that order. \f[I]sh\f[] refers to POSIX \f[C]sh\f[] (not the system\[aq]s), and will warn of portability issues. .RS .RE .TP .B \f[B]\-S\f[]\ \f[I]SEVERITY\f[],\ \f[B]\-\-severity=\f[]\f[I]severity\f[] Specify minimum severity of errors to consider. Valid values in order of severity are \f[I]error\f[], \f[I]warning\f[], \f[I]info\f[] and \f[I]style\f[]. The default is \f[I]style\f[]. .RS .RE .TP .B \f[B]\-V\f[],\ \f[B]\-\-version\f[] Print version information and exit. .RS .RE .TP .B \f[B]\-W\f[] \f[I]NUM\f[],\ \f[B]\-\-wiki\-link\-count=NUM\f[] For TTY output, show \f[I]NUM\f[] wiki links to more information about mentioned warnings. Set to 0 to disable them entirely. .RS .RE .TP .B \f[B]\-x\f[],\ \f[B]\-\-external\-sources\f[] Follow \[aq]source\[aq] statements even when the file is not specified as input. By default, \f[C]shellcheck\f[] will only follow files specified on the command line (plus \f[C]/dev/null\f[]). This option allows following any file the script may \f[C]source\f[]. .RS .RE .TP .B \f[B]FILES...\f[] One or more script files to check, or "\-" for standard input. .RS .RE .SH FORMATS .TP .B \f[B]tty\f[] Plain text, human readable output. This is the default. .RS .RE .TP .B \f[B]gcc\f[] GCC compatible output. Useful for editors that support compiling and showing syntax errors. .RS .PP For example, in Vim, \f[C]:set\ makeprg=shellcheck\\\ \-f\\\ gcc\\\ %\f[] will allow using \f[C]:make\f[] to check the script, and \f[C]:cnext\f[] to jump to the next error. .IP .nf \f[C] :::\ :\ \f[] .fi .RE .TP .B \f[B]checkstyle\f[] Checkstyle compatible XML output. Supported directly or through plugins by many IDEs and build monitoring systems. .RS .IP .nf \f[C] \ \ \ \ \ \ \ \ \ \ ... \ \ \ \ ... \f[] .fi .RE .TP .B \f[B]diff\f[] Auto\-fixes in unified diff format. Can be piped to \f[C]git\ apply\f[] or \f[C]patch\ \-p1\f[] to automatically apply fixes. .RS .IP .nf \f[C] \-\-\-\ a/test.sh +++\ b/test.sh \@\@\ \-2,6\ +2,6\ \@\@ \ ##\ Example\ of\ a\ broken\ script. \ for\ f\ in\ $(ls\ *.m3u) \ do \-\ \ grep\ \-qi\ hq.*mp3\ $f\ \\ +\ \ grep\ \-qi\ hq.*mp3\ "$f"\ \\ \ \ \ \ \ &&\ echo\ \-e\ \[aq]Playlist\ $f\ contains\ a\ HQ\ file\ in\ mp3\ format\[aq] \ done \f[] .fi .RE .TP .B \f[B]json1\f[] Json is a popular serialization format that is more suitable for web applications. ShellCheck\[aq]s json is compact and contains only the bare minimum. Tabs are counted as 1 character. .RS .IP .nf \f[C] { \ \ comments:\ [ \ \ \ \ { \ \ \ \ \ \ "file":\ "filename", \ \ \ \ \ \ "line":\ lineNumber, \ \ \ \ \ \ "column":\ columnNumber, \ \ \ \ \ \ "level":\ "severitylevel", \ \ \ \ \ \ "code":\ errorCode, \ \ \ \ \ \ "message":\ "warning\ message" \ \ \ \ }, \ \ \ \ ... \ \ ] } \f[] .fi .RE .TP .B \f[B]json\f[] This is a legacy version of the \f[B]json1\f[] format. It\[aq]s a raw array of comments, and all offsets have a tab stop of 8. .RS .RE .TP .B \f[B]quiet\f[] Suppress all normal output. Exit with zero if no issues are found, otherwise exit with one. Stops processing after the first issue. .RS .RE .SH DIRECTIVES .PP ShellCheck directives can be specified as comments in the shell script. If they appear before the first command, they are considered file\-wide. Otherwise, they apply to the immediately following command or block: .IP .nf \f[C] #\ shellcheck\ key=value\ key=value command\-or\-structure \f[] .fi .PP For example, to suppress SC2035 about using \f[C]\&./*.jpg\f[]: .IP .nf \f[C] #\ shellcheck\ disable=SC2035 echo\ "Files:\ "\ *.jpg \f[] .fi .PP To tell ShellCheck where to look for an otherwise dynamically determined file: .IP .nf \f[C] #\ shellcheck\ source=./lib.sh source\ "$(find_install_dir)/lib.sh" \f[] .fi .PP Here a shell brace group is used to suppress a warning on multiple lines: .IP .nf \f[C] #\ shellcheck\ disable=SC2016 { \ \ echo\ \[aq]Modifying\ $PATH\[aq] \ \ echo\ \[aq]PATH=foo:$PATH\[aq]\ >>\ ~/.bashrc } \f[] .fi .PP Valid keys are: .TP .B \f[B]disable\f[] Disables a comma separated list of error codes for the following command. The command can be a simple command like \f[C]echo\ foo\f[], or a compound command like a function definition, subshell block or loop. .RS .RE .TP .B \f[B]enable\f[] Enable an optional check by name, as listed with \f[B]\-\-list\-optional\f[]. Only file\-wide \f[C]enable\f[] directives are considered. .RS .RE .TP .B \f[B]source\f[] Overrides the filename included by a \f[C]source\f[]/\f[C]\&.\f[] statement. This can be used to tell shellcheck where to look for a file whose name is determined at runtime, or to skip a source by telling it to use \f[C]/dev/null\f[]. .RS .RE .TP .B \f[B]source\-path\f[] Add a directory to the search path for \f[C]source\f[]/\f[C]\&.\f[] statements (by default, only ShellCheck\[aq]s working directory is included). Absolute paths will also be rooted in these paths. The special path \f[C]SCRIPTDIR\f[] can be used to specify the currently checked script\[aq]s directory, as in \f[C]source\-path=SCRIPTDIR\f[] or \f[C]source\-path=SCRIPTDIR/../libs\f[]. Multiple paths accumulate, and \f[C]\-P\f[] takes precedence over them. .RS .RE .TP .B \f[B]shell\f[] Overrides the shell detected from the shebang. This is useful for files meant to be included (and thus lacking a shebang), or possibly as a more targeted alternative to \[aq]disable=2039\[aq]. .RS .RE .SH RC FILES .PP Unless \f[C]\-\-norc\f[] is used, ShellCheck will look for a file \f[C]\&.shellcheckrc\f[] or \f[C]shellcheckrc\f[] in the script\[aq]s directory and each parent directory. If found, it will read \f[C]key=value\f[] pairs from it and treat them as file\-wide directives. .PP Here is an example \f[C]\&.shellcheckrc\f[]: .IP .nf \f[C] #\ Look\ for\ \[aq]source\[aq]d\ files\ relative\ to\ the\ checked\ script, #\ and\ also\ look\ for\ absolute\ paths\ in\ /mnt/chroot source\-path=SCRIPTDIR source\-path=/mnt/chroot #\ Turn\ on\ warnings\ for\ unquoted\ variables\ with\ safe\ values enable=quote\-safe\-variables #\ Turn\ on\ warnings\ for\ unassigned\ uppercase\ variables enable=check\-unassigned\-uppercase #\ Allow\ using\ `which`\ since\ it\ gives\ full\ paths\ and\ is\ common\ enough disable=SC2230 \f[] .fi .PP If no \f[C]\&.shellcheckrc\f[] is found in any of the parent directories, ShellCheck will look in \f[C]~/.shellcheckrc\f[] followed by the XDG config directory (usually \f[C]~/.config/shellcheckrc\f[]) on Unix, or \f[C]%APPDATA%/shellcheckrc\f[] on Windows. Only the first file found will be used. .PP Note for Snap users: the Snap sandbox disallows access to hidden files. Use \f[C]shellcheckrc\f[] without the dot instead. .PP Note for Docker users: ShellCheck will only be able to look for files that are mounted in the container, so \f[C]~/.shellcheckrc\f[] will not be read. .SH ENVIRONMENT VARIABLES .PP The environment variable \f[C]SHELLCHECK_OPTS\f[] can be set with default flags: .IP .nf \f[C] export\ SHELLCHECK_OPTS=\[aq]\-\-shell=bash\ \-\-exclude=SC2016\[aq] \f[] .fi .PP Its value will be split on spaces and prepended to the command line on each invocation. .SH RETURN VALUES .PP ShellCheck uses the follow exit codes: .IP \[bu] 2 0: All files successfully scanned with no issues. .IP \[bu] 2 1: All files successfully scanned with some issues. .IP \[bu] 2 2: Some files could not be processed (e.g. file not found). .IP \[bu] 2 3: ShellCheck was invoked with bad syntax (e.g. unknown flag). .IP \[bu] 2 4: ShellCheck was invoked with bad options (e.g. unknown formatter). .SH LOCALE .PP This version of ShellCheck is only available in English. All files are leniently decoded as UTF\-8, with a fallback of ISO\-8859\-1 for invalid sequences. \f[C]LC_CTYPE\f[] is respected for output, and defaults to UTF\-8 for locales where encoding is unspecified (such as the \f[C]C\f[] locale). .PP Windows users seeing \f[C]commitBuffer:\ invalid\ argument\ (invalid\ character)\f[] should set their terminal to use UTF\-8 with \f[C]chcp\ 65001\f[]. .SH AUTHORS .PP ShellCheck is developed and maintained by Vidar Holen, with assistance from a long list of wonderful contributors. .SH REPORTING BUGS .PP Bugs and issues can be reported on GitHub: .PP https://github.com/koalaman/shellcheck/issues .SH COPYRIGHT .PP Copyright 2012\-2019, Vidar Holen and contributors. Licensed under the GNU General Public License version 3 or later, see https://gnu.org/licenses/gpl.html .SH SEE ALSO .PP sh(1) bash(1) ShellCheck-0.7.0/striptests0000755000000000000000000000260113517444075014074 0ustar0000000000000000#!/usr/bin/env bash # This file strips all unit tests from ShellCheck, removing # the dependency on QuickCheck and Template Haskell and # reduces the binary size considerably. set -o pipefail sponge() { local data data="$(cat)" printf '%s\n' "$data" > "$1" } modify() { if ! "${@:2}" < "$1" | sponge "$1" then { printf 'Failed to modify %s: ' "$1" printf '%q ' "${@:2}" printf '\n' } >&2 exit 1 fi } detestify() { printf '%s\n' '-- AUTOGENERATED from ShellCheck by striptests. Do not modify.' awk ' BEGIN { state = 0; } /LANGUAGE TemplateHaskell/ { next; } /^import.*Test\./ { next; } /^module/ { sub(/,[^,)]*runTests/, ""); } # Delete tests /^prop_/ { state = 1; next; } # ..and any blank lines following them. state == 1 && /^ / { next; } # Template Haskell marker /^return / { exit; } { state = 0; print; } ' } if [[ ! -e 'ShellCheck.cabal' ]] then echo "Run me from the ShellCheck directory." >&2 exit 1 fi if [[ -d '.git' ]] && ! git diff --exit-code > /dev/null 2>&1 then echo "You have local changes! These may be overwritten." >&2 exit 2 fi modify 'ShellCheck.cabal' sed -e ' /QuickCheck/d /^test-suite/{ s/.*//; q; } ' find . -name '.git' -prune -o -type f -name '*.hs' -print | while IFS= read -r file do modify "$file" detestify done ShellCheck-0.7.0/src/0000755000000000000000000000000013517444075012512 5ustar0000000000000000ShellCheck-0.7.0/src/ShellCheck/0000755000000000000000000000000013517444075014517 5ustar0000000000000000ShellCheck-0.7.0/src/ShellCheck/AST.hs0000644000000000000000000003360013517444075015504 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE DeriveGeneric, DeriveAnyClass #-} module ShellCheck.AST where import GHC.Generics (Generic) import Control.Monad.Identity import Control.DeepSeq import Text.Parsec import qualified ShellCheck.Regex as Re import Prelude hiding (id) newtype Id = Id Int deriving (Show, Eq, Ord, Generic, NFData) data Quoted = Quoted | Unquoted deriving (Show, Eq) data Dashed = Dashed | Undashed deriving (Show, Eq) data AssignmentMode = Assign | Append deriving (Show, Eq) newtype FunctionKeyword = FunctionKeyword Bool deriving (Show, Eq) newtype FunctionParentheses = FunctionParentheses Bool deriving (Show, Eq) data CaseType = CaseBreak | CaseFallThrough | CaseContinue deriving (Show, Eq) newtype Root = Root Token data Token = TA_Binary Id String Token Token | TA_Assignment Id String Token Token | TA_Variable Id String [Token] | TA_Expansion Id [Token] | TA_Sequence Id [Token] | TA_Trinary Id Token Token Token | TA_Unary Id String Token | TC_And Id ConditionType String Token Token | TC_Binary Id ConditionType String Token Token | TC_Group Id ConditionType Token | TC_Nullary Id ConditionType Token | TC_Or Id ConditionType String Token Token | TC_Unary Id ConditionType String Token | TC_Empty Id ConditionType | T_AND_IF Id | T_AndIf Id Token Token | T_Arithmetic Id Token | T_Array Id [Token] | T_IndexedElement Id [Token] Token -- Store the index as string, and parse as arithmetic or string later | T_UnparsedIndex Id SourcePos String | T_Assignment Id AssignmentMode String [Token] Token | T_Backgrounded Id Token | T_Backticked Id [Token] | T_Bang Id | T_Banged Id Token | T_BraceExpansion Id [Token] | T_BraceGroup Id [Token] | T_CLOBBER Id | T_Case Id | T_CaseExpression Id Token [(CaseType, [Token], [Token])] | T_Condition Id ConditionType Token | T_DGREAT Id | T_DLESS Id | T_DLESSDASH Id | T_DSEMI Id | T_Do Id | T_DollarArithmetic Id Token | T_DollarBraced Id Bool Token | T_DollarBracket Id Token | T_DollarDoubleQuoted Id [Token] | T_DollarExpansion Id [Token] | T_DollarSingleQuoted Id String | T_DollarBraceCommandExpansion Id [Token] | T_Done Id | T_DoubleQuoted Id [Token] | T_EOF Id | T_Elif Id | T_Else Id | T_Esac Id | T_Extglob Id String [Token] | T_FdRedirect Id String Token | T_Fi Id | T_For Id | T_ForArithmetic Id Token Token Token [Token] | T_ForIn Id String [Token] [Token] | T_Function Id FunctionKeyword FunctionParentheses String Token | T_GREATAND Id | T_Glob Id String | T_Greater Id | T_HereDoc Id Dashed Quoted String [Token] | T_HereString Id Token | T_If Id | T_IfExpression Id [([Token],[Token])] [Token] | T_In Id | T_IoFile Id Token Token | T_IoDuplicate Id Token String | T_LESSAND Id | T_LESSGREAT Id | T_Lbrace Id | T_Less Id | T_Literal Id String | T_Lparen Id | T_NEWLINE Id | T_NormalWord Id [Token] | T_OR_IF Id | T_OrIf Id Token Token | T_ParamSubSpecialChar Id String -- e.g. '%' in ${foo%bar} or '/' in ${foo/bar/baz} | T_Pipeline Id [Token] [Token] -- [Pipe separators] [Commands] | T_ProcSub Id String [Token] | T_Rbrace Id | T_Redirecting Id [Token] Token | T_Rparen Id | T_Script Id Token [Token] -- Shebang T_Literal, followed by script. | T_Select Id | T_SelectIn Id String [Token] [Token] | T_Semi Id | T_SimpleCommand Id [Token] [Token] | T_SingleQuoted Id String | T_Subshell Id [Token] | T_Then Id | T_Until Id | T_UntilExpression Id [Token] [Token] | T_While Id | T_WhileExpression Id [Token] [Token] | T_Annotation Id [Annotation] Token | T_Pipe Id String | T_CoProc Id (Maybe String) Token | T_CoProcBody Id Token | T_Include Id Token | T_SourceCommand Id Token Token | T_BatsTest Id Token Token deriving (Show) data Annotation = DisableComment Integer | EnableComment String | SourceOverride String | ShellOverride String | SourcePath String deriving (Show, Eq) data ConditionType = DoubleBracket | SingleBracket deriving (Show, Eq) -- This is an abomination. tokenEquals :: Token -> Token -> Bool tokenEquals a b = kludge a == kludge b where kludge s = Re.subRegex (Re.mkRegex "\\(Id [0-9]+\\)") (show s) "(Id 0)" instance Eq Token where (==) = tokenEquals analyze :: Monad m => (Token -> m ()) -> (Token -> m ()) -> (Token -> m Token) -> Token -> m Token analyze f g i = round where round t = do f t newT <- delve t g t i newT roundAll = mapM round dl l v = do x <- roundAll l return $ v x dll l m v = do x <- roundAll l y <- roundAll m return $ v x y d1 t v = do x <- round t return $ v x d2 t1 t2 v = do x <- round t1 y <- round t2 return $ v x y delve (T_NormalWord id list) = dl list $ T_NormalWord id delve (T_DoubleQuoted id list) = dl list $ T_DoubleQuoted id delve (T_DollarDoubleQuoted id list) = dl list $ T_DollarDoubleQuoted id delve (T_DollarExpansion id list) = dl list $ T_DollarExpansion id delve (T_DollarBraceCommandExpansion id list) = dl list $ T_DollarBraceCommandExpansion id delve (T_BraceExpansion id list) = dl list $ T_BraceExpansion id delve (T_Backticked id list) = dl list $ T_Backticked id delve (T_DollarArithmetic id c) = d1 c $ T_DollarArithmetic id delve (T_DollarBracket id c) = d1 c $ T_DollarBracket id delve (T_IoFile id op file) = d2 op file $ T_IoFile id delve (T_IoDuplicate id op num) = d1 op $ \x -> T_IoDuplicate id x num delve (T_HereString id word) = d1 word $ T_HereString id delve (T_FdRedirect id v t) = d1 t $ T_FdRedirect id v delve (T_Assignment id mode var indices value) = do a <- roundAll indices b <- round value return $ T_Assignment id mode var a b delve (T_Array id t) = dl t $ T_Array id delve (T_IndexedElement id indices t) = do a <- roundAll indices b <- round t return $ T_IndexedElement id a b delve (T_Redirecting id redirs cmd) = do a <- roundAll redirs b <- round cmd return $ T_Redirecting id a b delve (T_SimpleCommand id vars cmds) = dll vars cmds $ T_SimpleCommand id delve (T_Pipeline id l1 l2) = dll l1 l2 $ T_Pipeline id delve (T_Banged id l) = d1 l $ T_Banged id delve (T_AndIf id t u) = d2 t u $ T_AndIf id delve (T_OrIf id t u) = d2 t u $ T_OrIf id delve (T_Backgrounded id l) = d1 l $ T_Backgrounded id delve (T_Subshell id l) = dl l $ T_Subshell id delve (T_ProcSub id typ l) = dl l $ T_ProcSub id typ delve (T_Arithmetic id c) = d1 c $ T_Arithmetic id delve (T_IfExpression id conditions elses) = do newConds <- mapM (\(c, t) -> do x <- mapM round c y <- mapM round t return (x,y) ) conditions newElses <- roundAll elses return $ T_IfExpression id newConds newElses delve (T_BraceGroup id l) = dl l $ T_BraceGroup id delve (T_WhileExpression id c l) = dll c l $ T_WhileExpression id delve (T_UntilExpression id c l) = dll c l $ T_UntilExpression id delve (T_ForIn id v w l) = dll w l $ T_ForIn id v delve (T_SelectIn id v w l) = dll w l $ T_SelectIn id v delve (T_CaseExpression id word cases) = do newWord <- round word newCases <- mapM (\(o, c, t) -> do x <- mapM round c y <- mapM round t return (o, x,y) ) cases return $ T_CaseExpression id newWord newCases delve (T_ForArithmetic id a b c group) = do x <- round a y <- round b z <- round c list <- mapM round group return $ T_ForArithmetic id x y z list delve (T_Script id s l) = dl l $ T_Script id s delve (T_Function id a b name body) = d1 body $ T_Function id a b name delve (T_Condition id typ token) = d1 token $ T_Condition id typ delve (T_Extglob id str l) = dl l $ T_Extglob id str delve (T_DollarBraced id braced op) = d1 op $ T_DollarBraced id braced delve (T_HereDoc id d q str l) = dl l $ T_HereDoc id d q str delve (TC_And id typ str t1 t2) = d2 t1 t2 $ TC_And id typ str delve (TC_Or id typ str t1 t2) = d2 t1 t2 $ TC_Or id typ str delve (TC_Group id typ token) = d1 token $ TC_Group id typ delve (TC_Binary id typ op lhs rhs) = d2 lhs rhs $ TC_Binary id typ op delve (TC_Unary id typ op token) = d1 token $ TC_Unary id typ op delve (TC_Nullary id typ token) = d1 token $ TC_Nullary id typ delve (TA_Binary id op t1 t2) = d2 t1 t2 $ TA_Binary id op delve (TA_Assignment id op t1 t2) = d2 t1 t2 $ TA_Assignment id op delve (TA_Unary id op t1) = d1 t1 $ TA_Unary id op delve (TA_Sequence id l) = dl l $ TA_Sequence id delve (TA_Trinary id t1 t2 t3) = do a <- round t1 b <- round t2 c <- round t3 return $ TA_Trinary id a b c delve (TA_Expansion id t) = dl t $ TA_Expansion id delve (TA_Variable id str t) = dl t $ TA_Variable id str delve (T_Annotation id anns t) = d1 t $ T_Annotation id anns delve (T_CoProc id var body) = d1 body $ T_CoProc id var delve (T_CoProcBody id t) = d1 t $ T_CoProcBody id delve (T_Include id script) = d1 script $ T_Include id delve (T_SourceCommand id includer t_include) = d2 includer t_include $ T_SourceCommand id delve (T_BatsTest id name t) = d2 name t $ T_BatsTest id delve t = return t getId :: Token -> Id getId t = case t of T_AND_IF id -> id T_OR_IF id -> id T_DSEMI id -> id T_Semi id -> id T_DLESS id -> id T_DGREAT id -> id T_LESSAND id -> id T_GREATAND id -> id T_LESSGREAT id -> id T_DLESSDASH id -> id T_CLOBBER id -> id T_If id -> id T_Then id -> id T_Else id -> id T_Elif id -> id T_Fi id -> id T_Do id -> id T_Done id -> id T_Case id -> id T_Esac id -> id T_While id -> id T_Until id -> id T_For id -> id T_Select id -> id T_Lbrace id -> id T_Rbrace id -> id T_Lparen id -> id T_Rparen id -> id T_Bang id -> id T_In id -> id T_NEWLINE id -> id T_EOF id -> id T_Less id -> id T_Greater id -> id T_SingleQuoted id _ -> id T_Literal id _ -> id T_NormalWord id _ -> id T_DoubleQuoted id _ -> id T_DollarExpansion id _ -> id T_DollarBraced id _ _ -> id T_DollarArithmetic id _ -> id T_BraceExpansion id _ -> id T_ParamSubSpecialChar id _ -> id T_DollarBraceCommandExpansion id _ -> id T_IoFile id _ _ -> id T_IoDuplicate id _ _ -> id T_HereDoc id _ _ _ _ -> id T_HereString id _ -> id T_FdRedirect id _ _ -> id T_Assignment id _ _ _ _ -> id T_Array id _ -> id T_IndexedElement id _ _ -> id T_Redirecting id _ _ -> id T_SimpleCommand id _ _ -> id T_Pipeline id _ _ -> id T_Banged id _ -> id T_AndIf id _ _ -> id T_OrIf id _ _ -> id T_Backgrounded id _ -> id T_IfExpression id _ _ -> id T_Subshell id _ -> id T_BraceGroup id _ -> id T_WhileExpression id _ _ -> id T_UntilExpression id _ _ -> id T_ForIn id _ _ _ -> id T_SelectIn id _ _ _ -> id T_CaseExpression id _ _ -> id T_Function id _ _ _ _ -> id T_Arithmetic id _ -> id T_Script id _ _ -> id T_Condition id _ _ -> id T_Extglob id _ _ -> id T_Backticked id _ -> id TC_And id _ _ _ _ -> id TC_Or id _ _ _ _ -> id TC_Group id _ _ -> id TC_Binary id _ _ _ _ -> id TC_Unary id _ _ _ -> id TC_Nullary id _ _ -> id TA_Binary id _ _ _ -> id TA_Assignment id _ _ _ -> id TA_Unary id _ _ -> id TA_Sequence id _ -> id TA_Trinary id _ _ _ -> id TA_Expansion id _ -> id T_ProcSub id _ _ -> id T_Glob id _ -> id T_ForArithmetic id _ _ _ _ -> id T_DollarSingleQuoted id _ -> id T_DollarDoubleQuoted id _ -> id T_DollarBracket id _ -> id T_Annotation id _ _ -> id T_Pipe id _ -> id T_CoProc id _ _ -> id T_CoProcBody id _ -> id T_Include id _ -> id T_SourceCommand id _ _ -> id T_UnparsedIndex id _ _ -> id TC_Empty id _ -> id TA_Variable id _ _ -> id T_BatsTest id _ _ -> id blank :: Monad m => Token -> m () blank = const $ return () doAnalysis :: Monad m => (Token -> m ()) -> Token -> m Token doAnalysis f = analyze f blank return doStackAnalysis :: Monad m => (Token -> m ()) -> (Token -> m ()) -> Token -> m Token doStackAnalysis startToken endToken = analyze startToken endToken return doTransform :: (Token -> Token) -> Token -> Token doTransform i = runIdentity . analyze blank blank (return . i) ShellCheck-0.7.0/src/ShellCheck/ASTLib.hs0000644000000000000000000004226013517444075016135 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.ASTLib where import ShellCheck.AST import Control.Monad.Writer import Control.Monad import Data.Char import Data.Functor import Data.List import Data.Maybe -- Is this a type of loop? isLoop t = case t of T_WhileExpression {} -> True T_UntilExpression {} -> True T_ForIn {} -> True T_ForArithmetic {} -> True T_SelectIn {} -> True _ -> False -- Will this split into multiple words when used as an argument? willSplit x = case x of T_DollarBraced {} -> True T_DollarExpansion {} -> True T_Backticked {} -> True T_BraceExpansion {} -> True T_Glob {} -> True T_Extglob {} -> True T_NormalWord _ l -> any willSplit l _ -> False isGlob T_Extglob {} = True isGlob T_Glob {} = True isGlob (T_NormalWord _ l) = any isGlob l isGlob _ = False -- Is this shell word a constant? isConstant token = case token of -- This ignores some cases like ~"foo": T_NormalWord _ (T_Literal _ ('~':_) : _) -> False T_NormalWord _ l -> all isConstant l T_DoubleQuoted _ l -> all isConstant l T_SingleQuoted _ _ -> True T_Literal _ _ -> True _ -> False -- Is this an empty literal? isEmpty token = case token of T_NormalWord _ l -> all isEmpty l T_DoubleQuoted _ l -> all isEmpty l T_SingleQuoted _ "" -> True T_Literal _ "" -> True _ -> False -- Quick&lazy oversimplification of commands, throwing away details -- and returning a list like ["find", ".", "-name", "${VAR}*" ]. oversimplify token = case token of (T_NormalWord _ l) -> [concat (concatMap oversimplify l)] (T_DoubleQuoted _ l) -> [concat (concatMap oversimplify l)] (T_SingleQuoted _ s) -> [s] (T_DollarBraced _ _ _) -> ["${VAR}"] (T_DollarArithmetic _ _) -> ["${VAR}"] (T_DollarExpansion _ _) -> ["${VAR}"] (T_Backticked _ _) -> ["${VAR}"] (T_Glob _ s) -> [s] (T_Pipeline _ _ [x]) -> oversimplify x (T_Literal _ x) -> [x] (T_ParamSubSpecialChar _ x) -> [x] (T_SimpleCommand _ vars words) -> concatMap oversimplify words (T_Redirecting _ _ foo) -> oversimplify foo (T_DollarSingleQuoted _ s) -> [s] (T_Annotation _ _ s) -> oversimplify s -- Workaround for let "foo = bar" parsing (TA_Sequence _ [TA_Expansion _ v]) -> concatMap oversimplify v _ -> [] -- Turn a SimpleCommand foo -avz --bar=baz into args "a", "v", "z", "bar", -- each in a tuple of (token, stringFlag). Non-flag arguments are added with -- stringFlag == "". getFlagsUntil stopCondition (T_SimpleCommand _ _ (_:args)) = let tokenAndText = map (\x -> (x, concat $ oversimplify x)) args (flagArgs, rest) = break (stopCondition . snd) tokenAndText in concatMap flag flagArgs ++ map (\(t, _) -> (t, "")) rest where flag (x, '-':'-':arg) = [ (x, takeWhile (/= '=') arg) ] flag (x, '-':args) = map (\v -> (x, [v])) args flag (x, _) = [ (x, "") ] getFlagsUntil _ _ = error "Internal shellcheck error, please report! (getFlags on non-command)" -- Get all flags in a GNU way, up until -- getAllFlags :: Token -> [(Token, String)] getAllFlags = getFlagsUntil (== "--") -- Get all flags in a BSD way, up until first non-flag argument or -- getLeadingFlags = getFlagsUntil (\x -> x == "--" || (not $ "-" `isPrefixOf` x)) -- Check if a command has a flag. hasFlag cmd str = str `elem` (map snd $ getAllFlags cmd) -- Is this token a word that starts with a dash? isFlag token = case getWordParts token of T_Literal _ ('-':_) : _ -> True _ -> False -- Is this token a flag where the - is unquoted? isUnquotedFlag token = fromMaybe False $ do str <- getLeadingUnquotedString token return $ "-" `isPrefixOf` str -- Given a T_DollarBraced, return a simplified version of the string contents. bracedString (T_DollarBraced _ _ l) = concat $ oversimplify l bracedString _ = error "Internal shellcheck error, please report! (bracedString on non-variable)" -- Is this an expansion of multiple items of an array? isArrayExpansion t@(T_DollarBraced _ _ _) = let string = bracedString t in "@" `isPrefixOf` string || not ("#" `isPrefixOf` string) && "[@]" `isInfixOf` string isArrayExpansion _ = False -- Is it possible that this arg becomes multiple args? mayBecomeMultipleArgs t = willBecomeMultipleArgs t || f t where f t@(T_DollarBraced _ _ _) = let string = bracedString t in "!" `isPrefixOf` string f (T_DoubleQuoted _ parts) = any f parts f (T_NormalWord _ parts) = any f parts f _ = False -- Is it certain that this word will becomes multiple words? willBecomeMultipleArgs t = willConcatInAssignment t || f t where f T_Extglob {} = True f T_Glob {} = True f T_BraceExpansion {} = True f (T_DoubleQuoted _ parts) = any f parts f (T_NormalWord _ parts) = any f parts f _ = False -- This does token cause implicit concatenation in assignments? willConcatInAssignment token = case token of t@T_DollarBraced {} -> isArrayExpansion t (T_DoubleQuoted _ parts) -> any willConcatInAssignment parts (T_NormalWord _ parts) -> any willConcatInAssignment parts _ -> False -- Maybe get the literal string corresponding to this token getLiteralString :: Token -> Maybe String getLiteralString = getLiteralStringExt (const Nothing) -- Definitely get a literal string, skipping over all non-literals onlyLiteralString :: Token -> String onlyLiteralString = fromJust . getLiteralStringExt (const $ return "") -- Maybe get a literal string, but only if it's an unquoted argument. getUnquotedLiteral (T_NormalWord _ list) = concat <$> mapM str list where str (T_Literal _ s) = return s str _ = Nothing getUnquotedLiteral _ = Nothing -- Get the last unquoted T_Literal in a word like "${var}foo"THIS -- or nothing if the word does not end in an unquoted literal. getTrailingUnquotedLiteral :: Token -> Maybe Token getTrailingUnquotedLiteral t = case t of (T_NormalWord _ list@(_:_)) -> from (last list) _ -> Nothing where from t = case t of T_Literal {} -> return t _ -> Nothing -- Get the leading, unquoted, literal string of a token (if any). getLeadingUnquotedString :: Token -> Maybe String getLeadingUnquotedString t = case t of T_NormalWord _ ((T_Literal _ s) : _) -> return s _ -> Nothing -- Maybe get the literal string of this token and any globs in it. getGlobOrLiteralString = getLiteralStringExt f where f (T_Glob _ str) = return str f _ = Nothing -- Maybe get the literal value of a token, using a custom function -- to map unrecognized Tokens into strings. getLiteralStringExt :: (Token -> Maybe String) -> Token -> Maybe String getLiteralStringExt more = g where allInList = fmap concat . mapM g g (T_DoubleQuoted _ l) = allInList l g (T_DollarDoubleQuoted _ l) = allInList l g (T_NormalWord _ l) = allInList l g (TA_Expansion _ l) = allInList l g (T_SingleQuoted _ s) = return s g (T_Literal _ s) = return s g (T_ParamSubSpecialChar _ s) = return s g (T_DollarSingleQuoted _ s) = return $ decodeEscapes s g x = more x -- Bash style $'..' decoding decodeEscapes ('\\':c:cs) = case c of 'a' -> '\a' : rest 'b' -> '\b' : rest 'e' -> '\x1B' : rest 'f' -> '\f' : rest 'n' -> '\n' : rest 'r' -> '\r' : rest 't' -> '\t' : rest 'v' -> '\v' : rest '\'' -> '\'' : rest '"' -> '"' : rest '\\' -> '\\' : rest 'x' -> case cs of (x:y:more) -> if isHexDigit x && isHexDigit y then chr (16*(digitToInt x) + (digitToInt y)) : rest else '\\':c:rest _ | isOctDigit c -> let digits = take 3 $ takeWhile isOctDigit (c:cs) num = parseOct digits in (if num < 256 then chr num else '?') : rest _ -> '\\' : c : rest where rest = decodeEscapes cs parseOct = f 0 where f n "" = n f n (c:rest) = f (n * 8 + digitToInt c) rest decodeEscapes (c:cs) = c : decodeEscapes cs decodeEscapes [] = [] -- Is this token a string literal? isLiteral t = isJust $ getLiteralString t -- Turn a NormalWord like foo="bar $baz" into a series of constituent elements like [foo=,bar ,$baz] getWordParts (T_NormalWord _ l) = concatMap getWordParts l getWordParts (T_DoubleQuoted _ l) = l -- TA_Expansion is basically T_NormalWord for arithmetic expressions getWordParts (TA_Expansion _ l) = concatMap getWordParts l getWordParts other = [other] -- Return a list of NormalWords that would result from brace expansion braceExpand (T_NormalWord id list) = take 1000 $ do items <- mapM part list return $ T_NormalWord id items where part (T_BraceExpansion id items) = do item <- items braceExpand item part x = return x -- Maybe get a SimpleCommand from immediate wrappers like T_Redirections getCommand t = case t of T_Redirecting _ _ w -> getCommand w T_SimpleCommand _ _ (w:_) -> return t T_Annotation _ _ t -> getCommand t _ -> Nothing -- Maybe get the command name string of a token representing a command getCommandName :: Token -> Maybe String getCommandName = fst . getCommandNameAndToken -- Get the command name token from a command, i.e. -- the token representing 'ls' in 'ls -la 2> foo'. -- If it can't be determined, return the original token. getCommandTokenOrThis = snd . getCommandNameAndToken getCommandNameAndToken :: Token -> (Maybe String, Token) getCommandNameAndToken t = fromMaybe (Nothing, t) $ do (T_SimpleCommand _ _ (w:rest)) <- getCommand t s <- getLiteralString w if "busybox" `isSuffixOf` s || "builtin" == s then case rest of (applet:_) -> return (getLiteralString applet, applet) _ -> return (Just s, w) else return (Just s, w) -- If a command substitution is a single command, get its name. -- $(date +%s) = Just "date" getCommandNameFromExpansion :: Token -> Maybe String getCommandNameFromExpansion t = case t of T_DollarExpansion _ [c] -> extract c T_Backticked _ [c] -> extract c T_DollarBraceCommandExpansion _ [c] -> extract c _ -> Nothing where extract (T_Pipeline _ _ [cmd]) = getCommandName cmd extract _ = Nothing -- Get the basename of a token representing a command getCommandBasename = fmap basename . getCommandName where basename = reverse . takeWhile (/= '/') . reverse isAssignment t = case t of T_Redirecting _ _ w -> isAssignment w T_SimpleCommand _ (w:_) [] -> True T_Assignment {} -> True T_Annotation _ _ w -> isAssignment w _ -> False isOnlyRedirection t = case t of T_Pipeline _ _ [x] -> isOnlyRedirection x T_Annotation _ _ w -> isOnlyRedirection w T_Redirecting _ (_:_) c -> isOnlyRedirection c T_SimpleCommand _ [] [] -> True _ -> False isFunction t = case t of T_Function {} -> True; _ -> False -- Bats tests are functions for the purpose of 'local' and such isFunctionLike t = case t of T_Function {} -> True T_BatsTest {} -> True _ -> False isBraceExpansion t = case t of T_BraceExpansion {} -> True; _ -> False -- Get the lists of commands from tokens that contain them, such as -- the body of while loops or branches of if statements. getCommandSequences :: Token -> [[Token]] getCommandSequences t = case t of T_Script _ _ cmds -> [cmds] T_BraceGroup _ cmds -> [cmds] T_Subshell _ cmds -> [cmds] T_WhileExpression _ _ cmds -> [cmds] T_UntilExpression _ _ cmds -> [cmds] T_ForIn _ _ _ cmds -> [cmds] T_ForArithmetic _ _ _ _ cmds -> [cmds] T_IfExpression _ thens elses -> map snd thens ++ [elses] T_Annotation _ _ t -> getCommandSequences t _ -> [] -- Get a list of names of associative arrays getAssociativeArrays t = nub . execWriter $ doAnalysis f t where f :: Token -> Writer [String] () f t@T_SimpleCommand {} = fromMaybe (return ()) $ do name <- getCommandName t let assocNames = ["declare","local","typeset"] guard $ elem name assocNames let flags = getAllFlags t guard $ elem "A" $ map snd flags let args = map fst . filter ((==) "" . snd) $ flags let names = mapMaybe (getLiteralStringExt nameAssignments) args return $ tell names f _ = return () nameAssignments t = case t of T_Assignment _ _ name _ _ -> return name _ -> Nothing -- A Pseudoglob is a wildcard pattern used for checking if a match can succeed. -- For example, [[ $(cmd).jpg == [a-z] ]] will give the patterns *.jpg and ?, which -- can be proven never to match. data PseudoGlob = PGAny | PGMany | PGChar Char deriving (Eq, Show) -- Turn a word into a PG pattern, replacing all unknown/runtime values with -- PGMany. wordToPseudoGlob :: Token -> Maybe [PseudoGlob] wordToPseudoGlob word = simplifyPseudoGlob . concat <$> mapM f (getWordParts word) where f x = case x of T_Literal _ s -> return $ map PGChar s T_SingleQuoted _ s -> return $ map PGChar s T_DollarBraced {} -> return [PGMany] T_DollarExpansion {} -> return [PGMany] T_Backticked {} -> return [PGMany] T_Glob _ "?" -> return [PGAny] T_Glob _ ('[':_) -> return [PGAny] T_Glob {} -> return [PGMany] T_Extglob {} -> return [PGMany] _ -> return [PGMany] -- Turn a word into a PG pattern, but only if we can preserve -- exact semantics. wordToExactPseudoGlob :: Token -> Maybe [PseudoGlob] wordToExactPseudoGlob word = simplifyPseudoGlob . concat <$> mapM f (getWordParts word) where f x = case x of T_Literal _ s -> return $ map PGChar s T_SingleQuoted _ s -> return $ map PGChar s T_Glob _ "?" -> return [PGAny] T_Glob _ "*" -> return [PGMany] _ -> fail "Unknown token type" -- Reorder a PseudoGlob for more efficient matching, e.g. -- f?*?**g -> f??*g simplifyPseudoGlob :: [PseudoGlob] -> [PseudoGlob] simplifyPseudoGlob = f where f [] = [] f (x@(PGChar _) : rest ) = x : f rest f list = let (anys, rest) = span (\x -> x == PGMany || x == PGAny) list in order anys ++ f rest order s = let (any, many) = partition (== PGAny) s in any ++ take 1 many -- Check whether the two patterns can ever overlap. pseudoGlobsCanOverlap :: [PseudoGlob] -> [PseudoGlob] -> Bool pseudoGlobsCanOverlap = matchable where matchable x@(xf:xs) y@(yf:ys) = case (xf, yf) of (PGMany, _) -> matchable x ys || matchable xs y (_, PGMany) -> matchable x ys || matchable xs y (PGAny, _) -> matchable xs ys (_, PGAny) -> matchable xs ys (_, _) -> xf == yf && matchable xs ys matchable [] [] = True matchable (PGMany : rest) [] = matchable rest [] matchable (_:_) [] = False matchable [] r = matchable r [] -- Check whether the first pattern always overlaps the second. pseudoGlobIsSuperSetof :: [PseudoGlob] -> [PseudoGlob] -> Bool pseudoGlobIsSuperSetof = matchable where matchable x@(xf:xs) y@(yf:ys) = case (xf, yf) of (PGMany, PGMany) -> matchable x ys (PGMany, _) -> matchable x ys || matchable xs y (_, PGMany) -> False (PGAny, _) -> matchable xs ys (_, PGAny) -> False (_, _) -> xf == yf && matchable xs ys matchable [] [] = True matchable (PGMany : rest) [] = matchable rest [] matchable _ _ = False wordsCanBeEqual x y = fromMaybe True $ liftM2 pseudoGlobsCanOverlap (wordToPseudoGlob x) (wordToPseudoGlob y) -- Is this an expansion that can be quoted, -- e.g. $(foo) `foo` $foo (but not {foo,})? isQuoteableExpansion t = case t of T_DollarBraced {} -> True _ -> isCommandSubstitution t isCommandSubstitution t = case t of T_DollarExpansion {} -> True T_DollarBraceCommandExpansion {} -> True T_Backticked {} -> True _ -> False -- Is this a T_Annotation that ignores a specific code? isAnnotationIgnoringCode code t = case t of T_Annotation _ anns _ -> any hasNum anns _ -> False where hasNum (DisableComment ts) = code == ts hasNum _ = False ShellCheck-0.7.0/src/ShellCheck/Analytics.hs0000644000000000000000000051114013517444075017004 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} {-# LANGUAGE FlexibleContexts #-} module ShellCheck.Analytics (runAnalytics, optionalChecks, ShellCheck.Analytics.runTests) where import ShellCheck.AST import ShellCheck.ASTLib import ShellCheck.AnalyzerLib hiding (producesComments) import ShellCheck.Data import ShellCheck.Parser import ShellCheck.Interface import ShellCheck.Regex import Control.Arrow (first) import Control.Monad import Control.Monad.Identity import Control.Monad.State import Control.Monad.Writer import Control.Monad.Reader import Data.Char import Data.Functor import Data.Function (on) import Data.List import Data.Maybe import Data.Ord import Debug.Trace import qualified Data.Map.Strict as Map import Test.QuickCheck.All (forAllProperties) import Test.QuickCheck.Test (quickCheckWithResult, stdArgs, maxSuccess) -- Checks that are run on the AST root treeChecks :: [Parameters -> Token -> [TokenComment]] treeChecks = [ nodeChecksToTreeCheck nodeChecks ,subshellAssignmentCheck ,checkSpacefulness ,checkQuotesInLiterals ,checkShebangParameters ,checkFunctionsUsedExternally ,checkUnusedAssignments ,checkUnpassedInFunctions ,checkArrayWithoutIndex ,checkShebang ,checkUnassignedReferences ,checkUncheckedCdPushdPopd ,checkArrayAssignmentIndices ,checkUseBeforeDefinition ] runAnalytics :: AnalysisSpec -> [TokenComment] runAnalytics options = runList options treeChecks ++ runList options optionalChecks where root = asScript options optionals = getEnableDirectives root ++ asOptionalChecks options optionalChecks = if "all" `elem` optionals then map snd optionalTreeChecks else mapMaybe (\c -> Map.lookup c optionalCheckMap) optionals runList :: AnalysisSpec -> [Parameters -> Token -> [TokenComment]] -> [TokenComment] runList spec list = notes where root = asScript spec params = makeParameters spec notes = concatMap (\f -> f params root) list getEnableDirectives root = case root of T_Annotation _ list _ -> mapMaybe getEnable list _ -> [] where getEnable t = case t of EnableComment s -> return s _ -> Nothing checkList l t = concatMap (\f -> f t) l -- Checks that are run on each node in the AST runNodeAnalysis f p t = execWriter (doAnalysis (f p) t) -- Perform multiple node checks in a single iteration over the tree nodeChecksToTreeCheck checkList = runNodeAnalysis (\p t -> (mapM_ ((\ f -> f t) . (\ f -> f p)) checkList)) nodeChecks :: [Parameters -> Token -> Writer [TokenComment] ()] nodeChecks = [ checkUuoc ,checkPipePitfalls ,checkForInQuoted ,checkForInLs ,checkShorthandIf ,checkDollarStar ,checkUnquotedDollarAt ,checkStderrRedirect ,checkUnquotedN ,checkNumberComparisons ,checkSingleBracketOperators ,checkDoubleBracketOperators ,checkLiteralBreakingTest ,checkConstantNullary ,checkDivBeforeMult ,checkArithmeticDeref ,checkArithmeticBadOctal ,checkComparisonAgainstGlob ,checkCommarrays ,checkOrNeq ,checkEchoWc ,checkConstantIfs ,checkPipedAssignment ,checkAssignAteCommand ,checkUuoeVar ,checkQuotedCondRegex ,checkForInCat ,checkFindExec ,checkValidCondOps ,checkGlobbedRegex ,checkTestRedirects ,checkIndirectExpansion ,checkPS1Assignments ,checkBackticks ,checkInexplicablyUnquoted ,checkTildeInQuotes ,checkLonelyDotDash ,checkSpuriousExec ,checkSpuriousExpansion ,checkDollarBrackets ,checkSshHereDoc ,checkGlobsAsOptions ,checkWhileReadPitfalls ,checkArithmeticOpCommand ,checkCharRangeGlob ,checkUnquotedExpansions ,checkSingleQuotedVariables ,checkRedirectToSame ,checkPrefixAssignmentReference ,checkLoopKeywordScope ,checkCdAndBack ,checkWrongArithmeticAssignment ,checkConditionalAndOrs ,checkFunctionDeclarations ,checkStderrPipe ,checkOverridingPath ,checkArrayAsString ,checkUnsupported ,checkMultipleAppends ,checkSuspiciousIFS ,checkShouldUseGrepQ ,checkTestArgumentSplitting ,checkConcatenatedDollarAt ,checkTildeInPath ,checkMaskedReturns ,checkReadWithoutR ,checkLoopVariableReassignment ,checkTrailingBracket ,checkReturnAgainstZero ,checkRedirectedNowhere ,checkUnmatchableCases ,checkSubshellAsTest ,checkSplittingInArrays ,checkRedirectionToNumber ,checkGlobAsCommand ,checkFlagAsCommand ,checkEmptyCondition ,checkPipeToNowhere ,checkForLoopGlobVariables ,checkSubshelledTests ,checkInvertedStringTest ,checkRedirectionToCommand ,checkDollarQuoteParen ,checkUselessBang ] optionalChecks = map fst optionalTreeChecks prop_verifyOptionalExamples = all check optionalTreeChecks where check (desc, check) = verifyTree check (cdPositive desc) && verifyNotTree check (cdNegative desc) optionalTreeChecks :: [(CheckDescription, (Parameters -> Token -> [TokenComment]))] optionalTreeChecks = [ (newCheckDescription { cdName = "quote-safe-variables", cdDescription = "Suggest quoting variables without metacharacters", cdPositive = "var=hello; echo $var", cdNegative = "var=hello; echo \"$var\"" }, checkVerboseSpacefulness) ,(newCheckDescription { cdName = "avoid-nullary-conditions", cdDescription = "Suggest explicitly using -n in `[ $var ]`", cdPositive = "[ \"$var\" ]", cdNegative = "[ -n \"$var\" ]" }, nodeChecksToTreeCheck [checkNullaryExpansionTest]) ,(newCheckDescription { cdName = "add-default-case", cdDescription = "Suggest adding a default case in `case` statements", cdPositive = "case $? in 0) echo 'Success';; esac", cdNegative = "case $? in 0) echo 'Success';; *) echo 'Fail' ;; esac" }, nodeChecksToTreeCheck [checkDefaultCase]) ,(newCheckDescription { cdName = "require-variable-braces", cdDescription = "Suggest putting braces around all variable references", cdPositive = "var=hello; echo $var", cdNegative = "var=hello; echo ${var}" }, nodeChecksToTreeCheck [checkVariableBraces]) ,(newCheckDescription { cdName = "check-unassigned-uppercase", cdDescription = "Warn when uppercase variables are unassigned", cdPositive = "echo $VAR", cdNegative = "VAR=hello; echo $VAR" }, checkUnassignedReferences' True) ] optionalCheckMap :: Map.Map String (Parameters -> Token -> [TokenComment]) optionalCheckMap = Map.fromList $ map item optionalTreeChecks where item (desc, check) = (cdName desc, check) wouldHaveBeenGlob s = '*' `elem` s verify :: (Parameters -> Token -> Writer [TokenComment] ()) -> String -> Bool verify f s = checkNode f s == Just True verifyNot :: (Parameters -> Token -> Writer [TokenComment] ()) -> String -> Bool verifyNot f s = checkNode f s == Just False verifyTree :: (Parameters -> Token -> [TokenComment]) -> String -> Bool verifyTree f s = producesComments f s == Just True verifyNotTree :: (Parameters -> Token -> [TokenComment]) -> String -> Bool verifyNotTree f s = producesComments f s == Just False checkCommand str f t@(T_SimpleCommand id _ (cmd:rest)) = when (t `isCommand` str) $ f cmd rest checkCommand _ _ _ = return () checkUnqualifiedCommand str f t@(T_SimpleCommand id _ (cmd:rest)) = when (t `isUnqualifiedCommand` str) $ f cmd rest checkUnqualifiedCommand _ _ _ = return () checkNode f = producesComments (runNodeAnalysis f) producesComments :: (Parameters -> Token -> [TokenComment]) -> String -> Maybe Bool producesComments f s = do let pr = pScript s prRoot pr let spec = defaultSpec pr let params = makeParameters spec return . not . null $ filterByAnnotation spec params $ runList spec [f] -- Copied from https://wiki.haskell.org/Edit_distance dist :: Eq a => [a] -> [a] -> Int dist a b = last (if lab == 0 then mainDiag else if lab > 0 then lowers !! (lab - 1) else{- < 0 -} uppers !! (-1 - lab)) where mainDiag = oneDiag a b (head uppers) (-1 : head lowers) uppers = eachDiag a b (mainDiag : uppers) -- upper diagonals lowers = eachDiag b a (mainDiag : lowers) -- lower diagonals eachDiag a [] diags = [] eachDiag a (bch:bs) (lastDiag:diags) = oneDiag a bs nextDiag lastDiag : eachDiag a bs diags where nextDiag = head (tail diags) oneDiag a b diagAbove diagBelow = thisdiag where doDiag [] b nw n w = [] doDiag a [] nw n w = [] doDiag (ach:as) (bch:bs) nw n w = me : doDiag as bs me (tail n) (tail w) where me = if ach == bch then nw else 1 + min3 (head w) nw (head n) firstelt = 1 + head diagBelow thisdiag = firstelt : doDiag a b firstelt diagAbove (tail diagBelow) lab = length a - length b min3 x y z = if x < y then x else min y z hasFloatingPoint params = shellType params == Ksh -- Checks whether the current parent path is part of a condition isCondition [] = False isCondition [_] = False isCondition (child:parent:rest) = case child of T_BatsTest {} -> True -- count anything in a @test as conditional _ -> getId child `elem` map getId (getConditionChildren parent) || isCondition (parent:rest) where getConditionChildren t = case t of T_AndIf _ left right -> [left] T_OrIf id left right -> [left] T_IfExpression id conditions elses -> concatMap (take 1 . reverse . fst) conditions T_WhileExpression id c l -> take 1 . reverse $ c T_UntilExpression id c l -> take 1 . reverse $ c _ -> [] -- helpers to build replacements replaceStart id params n r = let tp = tokenPositions params (start, _) = tp Map.! id new_end = start { posColumn = posColumn start + n } depth = length $ getPath (parentMap params) (T_EOF id) in newReplacement { repStartPos = start, repEndPos = new_end, repString = r, repPrecedence = depth, repInsertionPoint = InsertAfter } replaceEnd id params n r = let tp = tokenPositions params (_, end) = tp Map.! id new_start = end { posColumn = posColumn end - n } new_end = end { posColumn = posColumn end } depth = length $ getPath (parentMap params) (T_EOF id) in newReplacement { repStartPos = new_start, repEndPos = new_end, repString = r, repPrecedence = depth, repInsertionPoint = InsertBefore } surroundWidth id params s = fixWith [replaceStart id params 0 s, replaceEnd id params 0 s] fixWith fixes = newFix { fixReplacements = fixes } prop_checkEchoWc3 = verify checkEchoWc "n=$(echo $foo | wc -c)" checkEchoWc _ (T_Pipeline id _ [a, b]) = when (acmd == ["echo", "${VAR}"]) $ case bcmd of ["wc", "-c"] -> countMsg ["wc", "-m"] -> countMsg _ -> return () where acmd = oversimplify a bcmd = oversimplify b countMsg = style id 2000 "See if you can use ${#variable} instead." checkEchoWc _ _ = return () prop_checkPipedAssignment1 = verify checkPipedAssignment "A=ls | grep foo" prop_checkPipedAssignment2 = verifyNot checkPipedAssignment "A=foo cmd | grep foo" prop_checkPipedAssignment3 = verifyNot checkPipedAssignment "A=foo" checkPipedAssignment _ (T_Pipeline _ _ (T_Redirecting _ _ (T_SimpleCommand id (_:_) []):_:_)) = warn id 2036 "If you wanted to assign the output of the pipeline, use a=$(b | c) ." checkPipedAssignment _ _ = return () prop_checkAssignAteCommand1 = verify checkAssignAteCommand "A=ls -l" prop_checkAssignAteCommand2 = verify checkAssignAteCommand "A=ls --sort=$foo" prop_checkAssignAteCommand3 = verify checkAssignAteCommand "A=cat foo | grep bar" prop_checkAssignAteCommand4 = verifyNot checkAssignAteCommand "A=foo ls -l" prop_checkAssignAteCommand5 = verify checkAssignAteCommand "PAGER=cat grep bar" prop_checkAssignAteCommand6 = verifyNot checkAssignAteCommand "PAGER=\"cat\" grep bar" prop_checkAssignAteCommand7 = verify checkAssignAteCommand "here=pwd" checkAssignAteCommand _ (T_SimpleCommand id (T_Assignment _ _ _ _ assignmentTerm:[]) list) = -- Check if first word is intended as an argument (flag or glob). if firstWordIsArg list then err id 2037 "To assign the output of a command, use var=$(cmd) ." else -- Check if it's a known, unquoted command name. when (isCommonCommand $ getUnquotedLiteral assignmentTerm) $ warn id 2209 "Use var=$(command) to assign output (or quote to assign string)." where isCommonCommand (Just s) = s `elem` commonCommands isCommonCommand _ = False firstWordIsArg list = fromMaybe False $ do head <- list !!! 0 return $ isGlob head || isUnquotedFlag head checkAssignAteCommand _ _ = return () prop_checkArithmeticOpCommand1 = verify checkArithmeticOpCommand "i=i + 1" prop_checkArithmeticOpCommand2 = verify checkArithmeticOpCommand "foo=bar * 2" prop_checkArithmeticOpCommand3 = verifyNot checkArithmeticOpCommand "foo + opts" checkArithmeticOpCommand _ (T_SimpleCommand id [T_Assignment {}] (firstWord:_)) = fromMaybe (return ()) $ check <$> getGlobOrLiteralString firstWord where check op = when (op `elem` ["+", "-", "*", "/"]) $ warn (getId firstWord) 2099 $ "Use $((..)) for arithmetics, e.g. i=$((i " ++ op ++ " 2))" checkArithmeticOpCommand _ _ = return () prop_checkWrongArit = verify checkWrongArithmeticAssignment "i=i+1" prop_checkWrongArit2 = verify checkWrongArithmeticAssignment "n=2; i=n*2" checkWrongArithmeticAssignment params (T_SimpleCommand id (T_Assignment _ _ _ _ val:[]) []) = fromMaybe (return ()) $ do str <- getNormalString val match <- matchRegex regex str var <- match !!! 0 op <- match !!! 1 Map.lookup var references return . warn (getId val) 2100 $ "Use $((..)) for arithmetics, e.g. i=$((i " ++ op ++ " 2))" where regex = mkRegex "^([_a-zA-Z][_a-zA-Z0-9]*)([+*-]).+$" references = foldl (flip ($)) Map.empty (map insertRef $ variableFlow params) insertRef (Assignment (_, _, name, _)) = Map.insert name () insertRef _ = Prelude.id getNormalString (T_NormalWord _ words) = do parts <- foldl (liftM2 (\x y -> x ++ [y])) (Just []) $ map getLiterals words return $ concat parts getNormalString _ = Nothing getLiterals (T_Literal _ s) = return s getLiterals (T_Glob _ s) = return s getLiterals _ = Nothing checkWrongArithmeticAssignment _ _ = return () prop_checkUuoc1 = verify checkUuoc "cat foo | grep bar" prop_checkUuoc2 = verifyNot checkUuoc "cat * | grep bar" prop_checkUuoc3 = verify checkUuoc "cat $var | grep bar" prop_checkUuoc4 = verifyNot checkUuoc "cat $var" prop_checkUuoc5 = verifyNot checkUuoc "cat \"$@\"" prop_checkUuoc6 = verifyNot checkUuoc "cat -n | grep bar" checkUuoc _ (T_Pipeline _ _ (T_Redirecting _ _ cmd:_:_)) = checkCommand "cat" (const f) cmd where f [word] = unless (mayBecomeMultipleArgs word || isOption word) $ style (getId word) 2002 "Useless cat. Consider 'cmd < file | ..' or 'cmd file | ..' instead." f _ = return () isOption word = "-" `isPrefixOf` onlyLiteralString word checkUuoc _ _ = return () prop_checkPipePitfalls3 = verify checkPipePitfalls "ls | grep -v mp3" prop_checkPipePitfalls4 = verifyNot checkPipePitfalls "find . -print0 | xargs -0 foo" prop_checkPipePitfalls5 = verifyNot checkPipePitfalls "ls -N | foo" prop_checkPipePitfalls6 = verify checkPipePitfalls "find . | xargs foo" prop_checkPipePitfalls7 = verifyNot checkPipePitfalls "find . -printf '%s\\n' | xargs foo" prop_checkPipePitfalls8 = verify checkPipePitfalls "foo | grep bar | wc -l" prop_checkPipePitfalls9 = verifyNot checkPipePitfalls "foo | grep -o bar | wc -l" prop_checkPipePitfalls10 = verifyNot checkPipePitfalls "foo | grep -o bar | wc" prop_checkPipePitfalls11 = verifyNot checkPipePitfalls "foo | grep bar | wc" prop_checkPipePitfalls12 = verifyNot checkPipePitfalls "foo | grep -o bar | wc -c" prop_checkPipePitfalls13 = verifyNot checkPipePitfalls "foo | grep bar | wc -c" prop_checkPipePitfalls14 = verifyNot checkPipePitfalls "foo | grep -o bar | wc -cmwL" prop_checkPipePitfalls15 = verifyNot checkPipePitfalls "foo | grep bar | wc -cmwL" prop_checkPipePitfalls16 = verifyNot checkPipePitfalls "foo | grep -r bar | wc -l" checkPipePitfalls _ (T_Pipeline id _ commands) = do for ["find", "xargs"] $ \(find:xargs:_) -> let args = oversimplify xargs ++ oversimplify find in unless (any ($ args) [ hasShortParameter '0', hasParameter "null", hasParameter "print0", hasParameter "printf" ]) $ warn (getId find) 2038 "Use -print0/-0 or -exec + to allow for non-alphanumeric filenames." for' ["ps", "grep"] $ \x -> info x 2009 "Consider using pgrep instead of grepping ps output." for ["grep", "wc"] $ \(grep:wc:_) -> let flagsGrep = fromMaybe [] $ map snd . getAllFlags <$> getCommand grep flagsWc = fromMaybe [] $ map snd . getAllFlags <$> getCommand wc in unless (any (`elem` ["o", "only-matching", "r", "R", "recursive"]) flagsGrep || any (`elem` ["m", "chars", "w", "words", "c", "bytes", "L", "max-line-length"]) flagsWc || null flagsWc) $ style (getId grep) 2126 "Consider using grep -c instead of grep|wc -l." didLs <- fmap or . sequence $ [ for' ["ls", "grep"] $ \x -> warn x 2010 "Don't use ls | grep. Use a glob or a for loop with a condition to allow non-alphanumeric filenames.", for' ["ls", "xargs"] $ \x -> warn x 2011 "Use 'find .. -print0 | xargs -0 ..' or 'find .. -exec .. +' to allow non-alphanumeric filenames." ] unless didLs $ do for ["ls", "?"] $ \(ls:_) -> unless (hasShortParameter 'N' (oversimplify ls)) $ info (getId ls) 2012 "Use find instead of ls to better handle non-alphanumeric filenames." return () where for l f = let indices = indexOfSublists l (map (headOrDefault "" . oversimplify) commands) in do mapM_ (f . (\ n -> take (length l) $ drop n commands)) indices return . not . null $ indices for' l f = for l (first f) first func (x:_) = func (getId $ getCommandTokenOrThis x) first _ _ = return () hasShortParameter char = any (\x -> "-" `isPrefixOf` x && char `elem` x) hasParameter string = any (isPrefixOf string . dropWhile (== '-')) checkPipePitfalls _ _ = return () indexOfSublists sub = f 0 where f _ [] = [] f n a@(r:rest) = let others = f (n+1) rest in if match sub a then n:others else others match ("?":r1) (_:r2) = match r1 r2 match (x1:r1) (x2:r2) | x1 == x2 = match r1 r2 match [] _ = True match _ _ = False prop_checkShebangParameters1 = verifyTree checkShebangParameters "#!/usr/bin/env bash -x\necho cow" prop_checkShebangParameters2 = verifyNotTree checkShebangParameters "#! /bin/sh -l " checkShebangParameters p (T_Annotation _ _ t) = checkShebangParameters p t checkShebangParameters _ (T_Script _ (T_Literal id sb) _) = [makeComment ErrorC id 2096 "On most OS, shebangs can only specify a single parameter." | length (words sb) > 2] prop_checkShebang1 = verifyNotTree checkShebang "#!/usr/bin/env bash -x\necho cow" prop_checkShebang2 = verifyNotTree checkShebang "#! /bin/sh -l " prop_checkShebang3 = verifyTree checkShebang "ls -l" prop_checkShebang4 = verifyNotTree checkShebang "#shellcheck shell=sh\nfoo" prop_checkShebang5 = verifyTree checkShebang "#!/usr/bin/env ash" prop_checkShebang6 = verifyNotTree checkShebang "#!/usr/bin/env ash\n# shellcheck shell=dash\n" prop_checkShebang7 = verifyNotTree checkShebang "#!/usr/bin/env ash\n# shellcheck shell=sh\n" prop_checkShebang8 = verifyTree checkShebang "#!bin/sh\ntrue" prop_checkShebang9 = verifyNotTree checkShebang "# shellcheck shell=sh\ntrue" prop_checkShebang10= verifyNotTree checkShebang "#!foo\n# shellcheck shell=sh ignore=SC2239\ntrue" prop_checkShebang11= verifyTree checkShebang "#!/bin/sh/\ntrue" prop_checkShebang12= verifyTree checkShebang "#!/bin/sh/ -xe\ntrue" checkShebang params (T_Annotation _ list t) = if any isOverride list then [] else checkShebang params t where isOverride (ShellOverride _) = True isOverride _ = False checkShebang params (T_Script _ (T_Literal id sb) _) = execWriter $ do unless (shellTypeSpecified params) $ do when (sb == "") $ err id 2148 "Tips depend on target shell and yours is unknown. Add a shebang." when (executableFromShebang sb == "ash") $ warn id 2187 "Ash scripts will be checked as Dash. Add '# shellcheck shell=dash' to silence." unless (null sb) $ do unless ("/" `isPrefixOf` sb) $ err id 2239 "Ensure the shebang uses an absolute path to the interpreter." case words sb of first:_ -> when ("/" `isSuffixOf` first) $ err id 2246 "This shebang specifies a directory. Ensure the interpreter is a file." prop_checkForInQuoted = verify checkForInQuoted "for f in \"$(ls)\"; do echo foo; done" prop_checkForInQuoted2 = verifyNot checkForInQuoted "for f in \"$@\"; do echo foo; done" prop_checkForInQuoted2a = verifyNot checkForInQuoted "for f in *.mp3; do echo foo; done" prop_checkForInQuoted2b = verify checkForInQuoted "for f in \"*.mp3\"; do echo foo; done" prop_checkForInQuoted3 = verify checkForInQuoted "for f in 'find /'; do true; done" prop_checkForInQuoted4 = verify checkForInQuoted "for f in 1,2,3; do true; done" prop_checkForInQuoted4a = verifyNot checkForInQuoted "for f in foo{1,2,3}; do true; done" prop_checkForInQuoted5 = verify checkForInQuoted "for f in ls; do true; done" prop_checkForInQuoted6 = verifyNot checkForInQuoted "for f in \"${!arr}\"; do true; done" checkForInQuoted _ (T_ForIn _ f [T_NormalWord _ [word@(T_DoubleQuoted id list)]] _) = when (any (\x -> willSplit x && not (mayBecomeMultipleArgs x)) list || (fmap wouldHaveBeenGlob (getLiteralString word) == Just True)) $ err id 2066 "Since you double quoted this, it will not word split, and the loop will only run once." checkForInQuoted _ (T_ForIn _ f [T_NormalWord _ [T_SingleQuoted id _]] _) = warn id 2041 "This is a literal string. To run as a command, use $(..) instead of '..' . " checkForInQuoted _ (T_ForIn _ f [T_NormalWord _ [T_Literal id s]] _) = if ',' `elem` s then unless ('{' `elem` s) $ warn id 2042 "Use spaces, not commas, to separate loop elements." else warn id 2043 "This loop will only ever run once for a constant value. Did you perhaps mean to loop over dir/*, $var or $(cmd)?" checkForInQuoted _ _ = return () prop_checkForInCat1 = verify checkForInCat "for f in $(cat foo); do stuff; done" prop_checkForInCat1a= verify checkForInCat "for f in `cat foo`; do stuff; done" prop_checkForInCat2 = verify checkForInCat "for f in $(cat foo | grep lol); do stuff; done" prop_checkForInCat2a= verify checkForInCat "for f in `cat foo | grep lol`; do stuff; done" prop_checkForInCat3 = verifyNot checkForInCat "for f in $(cat foo | grep bar | wc -l); do stuff; done" checkForInCat _ (T_ForIn _ f [T_NormalWord _ w] _) = mapM_ checkF w where checkF (T_DollarExpansion id [T_Pipeline _ _ r]) | all isLineBased r = info id 2013 "To read lines rather than words, pipe/redirect to a 'while read' loop." checkF (T_Backticked id cmds) = checkF (T_DollarExpansion id cmds) checkF _ = return () isLineBased cmd = any (cmd `isCommand`) ["grep", "fgrep", "egrep", "sed", "cat", "awk", "cut", "sort"] checkForInCat _ _ = return () prop_checkForInLs = verify checkForInLs "for f in $(ls *.mp3); do mplayer \"$f\"; done" prop_checkForInLs2 = verify checkForInLs "for f in `ls *.mp3`; do mplayer \"$f\"; done" prop_checkForInLs3 = verify checkForInLs "for f in `find / -name '*.mp3'`; do mplayer \"$f\"; done" checkForInLs _ = try where try (T_ForIn _ f [T_NormalWord _ [T_DollarExpansion id [x]]] _) = check id f x try (T_ForIn _ f [T_NormalWord _ [T_Backticked id [x]]] _) = check id f x try _ = return () check id f x = case oversimplify x of ("ls":n) -> let warntype = if any ("-" `isPrefixOf`) n then warn else err in warntype id 2045 "Iterating over ls output is fragile. Use globs." ("find":_) -> warn id 2044 "For loops over find output are fragile. Use find -exec or a while read loop." _ -> return () prop_checkFindExec1 = verify checkFindExec "find / -name '*.php' -exec rm {};" prop_checkFindExec2 = verify checkFindExec "find / -exec touch {} && ls {} \\;" prop_checkFindExec3 = verify checkFindExec "find / -execdir cat {} | grep lol +" prop_checkFindExec4 = verifyNot checkFindExec "find / -name '*.php' -exec foo {} +" prop_checkFindExec5 = verifyNot checkFindExec "find / -execdir bash -c 'a && b' \\;" prop_checkFindExec6 = verify checkFindExec "find / -type d -execdir rm *.jpg \\;" checkFindExec _ cmd@(T_SimpleCommand _ _ t@(h:r)) | cmd `isCommand` "find" = do c <- broken r False when c $ let wordId = getId $ last t in err wordId 2067 "Missing ';' or + terminating -exec. You can't use |/||/&&, and ';' has to be a separate, quoted argument." where broken [] v = return v broken (w:r) v = do when v (mapM_ warnFor $ fromWord w) case getLiteralString w of Just "-exec" -> broken r True Just "-execdir" -> broken r True Just "+" -> broken r False Just ";" -> broken r False _ -> broken r v shouldWarn x = case x of T_DollarExpansion _ _ -> True T_Backticked _ _ -> True T_Glob _ _ -> True T_Extglob {} -> True _ -> False warnFor x = when(shouldWarn x) $ info (getId x) 2014 "This will expand once before find runs, not per file found." fromWord (T_NormalWord _ l) = l fromWord _ = [] checkFindExec _ _ = return () prop_checkUnquotedExpansions1 = verify checkUnquotedExpansions "rm $(ls)" prop_checkUnquotedExpansions1a= verify checkUnquotedExpansions "rm `ls`" prop_checkUnquotedExpansions2 = verify checkUnquotedExpansions "rm foo$(date)" prop_checkUnquotedExpansions3 = verify checkUnquotedExpansions "[ $(foo) == cow ]" prop_checkUnquotedExpansions3a= verify checkUnquotedExpansions "[ ! $(foo) ]" prop_checkUnquotedExpansions4 = verifyNot checkUnquotedExpansions "[[ $(foo) == cow ]]" prop_checkUnquotedExpansions5 = verifyNot checkUnquotedExpansions "for f in $(cmd); do echo $f; done" prop_checkUnquotedExpansions6 = verifyNot checkUnquotedExpansions "$(cmd)" prop_checkUnquotedExpansions7 = verifyNot checkUnquotedExpansions "cat << foo\n$(ls)\nfoo" prop_checkUnquotedExpansions8 = verifyNot checkUnquotedExpansions "set -- $(seq 1 4)" prop_checkUnquotedExpansions9 = verifyNot checkUnquotedExpansions "echo foo `# inline comment`" checkUnquotedExpansions params = check where check t@(T_DollarExpansion _ c) = examine t c check t@(T_Backticked _ c) = examine t c check t@(T_DollarBraceCommandExpansion _ c) = examine t c check _ = return () tree = parentMap params examine t contents = unless (null contents || shouldBeSplit t || isQuoteFree tree t || usedAsCommandName tree t) $ warn (getId t) 2046 "Quote this to prevent word splitting." shouldBeSplit t = getCommandNameFromExpansion t == Just "seq" prop_checkRedirectToSame = verify checkRedirectToSame "cat foo > foo" prop_checkRedirectToSame2 = verify checkRedirectToSame "cat lol | sed -e 's/a/b/g' > lol" prop_checkRedirectToSame3 = verifyNot checkRedirectToSame "cat lol | sed -e 's/a/b/g' > foo.bar && mv foo.bar lol" prop_checkRedirectToSame4 = verifyNot checkRedirectToSame "foo /dev/null > /dev/null" prop_checkRedirectToSame5 = verifyNot checkRedirectToSame "foo > bar 2> bar" prop_checkRedirectToSame6 = verifyNot checkRedirectToSame "echo foo > foo" prop_checkRedirectToSame7 = verifyNot checkRedirectToSame "sed 's/foo/bar/g' file | sponge file" prop_checkRedirectToSame8 = verifyNot checkRedirectToSame "while read -r line; do _=\"$fname\"; done <\"$fname\"" checkRedirectToSame params s@(T_Pipeline _ _ list) = mapM_ (\l -> (mapM_ (\x -> doAnalysis (checkOccurrences x) l) (getAllRedirs list))) list where note x = makeComment InfoC x 2094 "Make sure not to read and write the same file in the same pipeline." checkOccurrences t@(T_NormalWord exceptId x) u@(T_NormalWord newId y) = when (exceptId /= newId && x == y && not (isOutput t && isOutput u) && not (special t) && not (any isHarmlessCommand [t,u]) && not (any containsAssignment [u])) $ do addComment $ note newId addComment $ note exceptId checkOccurrences _ _ = return () getAllRedirs = concatMap (\t -> case t of T_Redirecting _ ls _ -> concatMap getRedirs ls _ -> []) getRedirs (T_FdRedirect _ _ (T_IoFile _ op file)) = case op of T_Greater _ -> [file] T_Less _ -> [file] T_DGREAT _ -> [file] _ -> [] getRedirs _ = [] special x = "/dev/" `isPrefixOf` concat (oversimplify x) isOutput t = case drop 1 $ getPath (parentMap params) t of T_IoFile _ op _:_ -> case op of T_Greater _ -> True T_DGREAT _ -> True _ -> False _ -> False isHarmlessCommand arg = fromMaybe False $ do cmd <- getClosestCommand (parentMap params) arg name <- getCommandBasename cmd return $ name `elem` ["echo", "printf", "sponge"] containsAssignment arg = fromMaybe False $ do cmd <- getClosestCommand (parentMap params) arg return $ isAssignment cmd checkRedirectToSame _ _ = return () prop_checkShorthandIf = verify checkShorthandIf "[[ ! -z file ]] && scp file host || rm file" prop_checkShorthandIf2 = verifyNot checkShorthandIf "[[ ! -z file ]] && { scp file host || echo 'Eek'; }" prop_checkShorthandIf3 = verifyNot checkShorthandIf "foo && bar || echo baz" prop_checkShorthandIf4 = verifyNot checkShorthandIf "foo && a=b || a=c" prop_checkShorthandIf5 = verifyNot checkShorthandIf "foo && rm || printf b" prop_checkShorthandIf6 = verifyNot checkShorthandIf "if foo && bar || baz; then true; fi" prop_checkShorthandIf7 = verifyNot checkShorthandIf "while foo && bar || baz; do true; done" prop_checkShorthandIf8 = verify checkShorthandIf "if true; then foo && bar || baz; fi" checkShorthandIf params x@(T_AndIf id _ (T_OrIf _ _ (T_Pipeline _ _ t))) | not (isOk t || inCondition) = info id 2015 "Note that A && B || C is not if-then-else. C may run when A is true." where isOk [t] = isAssignment t || fromMaybe False (do name <- getCommandBasename t return $ name `elem` ["echo", "exit", "return", "printf"]) isOk _ = False inCondition = isCondition $ getPath (parentMap params) x checkShorthandIf _ _ = return () prop_checkDollarStar = verify checkDollarStar "for f in $*; do ..; done" prop_checkDollarStar2 = verifyNot checkDollarStar "a=$*" prop_checkDollarStar3 = verifyNot checkDollarStar "[[ $* = 'a b' ]]" checkDollarStar p t@(T_NormalWord _ [b@(T_DollarBraced id _ _)]) | bracedString b == "*" = unless (isStrictlyQuoteFree (parentMap p) t) $ warn id 2048 "Use \"$@\" (with quotes) to prevent whitespace problems." checkDollarStar _ _ = return () prop_checkUnquotedDollarAt = verify checkUnquotedDollarAt "ls $@" prop_checkUnquotedDollarAt1= verifyNot checkUnquotedDollarAt "ls ${#@}" prop_checkUnquotedDollarAt2 = verify checkUnquotedDollarAt "ls ${foo[@]}" prop_checkUnquotedDollarAt3 = verifyNot checkUnquotedDollarAt "ls ${#foo[@]}" prop_checkUnquotedDollarAt4 = verifyNot checkUnquotedDollarAt "ls \"$@\"" prop_checkUnquotedDollarAt5 = verifyNot checkUnquotedDollarAt "ls ${foo/@/ at }" prop_checkUnquotedDollarAt6 = verifyNot checkUnquotedDollarAt "a=$@" prop_checkUnquotedDollarAt7 = verify checkUnquotedDollarAt "for f in ${var[@]}; do true; done" prop_checkUnquotedDollarAt8 = verifyNot checkUnquotedDollarAt "echo \"${args[@]:+${args[@]}}\"" prop_checkUnquotedDollarAt9 = verifyNot checkUnquotedDollarAt "echo ${args[@]:+\"${args[@]}\"}" prop_checkUnquotedDollarAt10 = verifyNot checkUnquotedDollarAt "echo ${@+\"$@\"}" checkUnquotedDollarAt p word@(T_NormalWord _ parts) | not $ isStrictlyQuoteFree (parentMap p) word = forM_ (take 1 $ filter isArrayExpansion parts) $ \x -> unless (isQuotedAlternativeReference x) $ err (getId x) 2068 "Double quote array expansions to avoid re-splitting elements." checkUnquotedDollarAt _ _ = return () prop_checkConcatenatedDollarAt1 = verify checkConcatenatedDollarAt "echo \"foo$@\"" prop_checkConcatenatedDollarAt2 = verify checkConcatenatedDollarAt "echo ${arr[@]}lol" prop_checkConcatenatedDollarAt3 = verify checkConcatenatedDollarAt "echo $a$@" prop_checkConcatenatedDollarAt4 = verifyNot checkConcatenatedDollarAt "echo $@" prop_checkConcatenatedDollarAt5 = verifyNot checkConcatenatedDollarAt "echo \"${arr[@]}\"" checkConcatenatedDollarAt p word@T_NormalWord {} | not $ isQuoteFree (parentMap p) word = unless (null $ drop 1 parts) $ mapM_ for array where parts = getWordParts word array = take 1 $ filter isArrayExpansion parts for t = err (getId t) 2145 "Argument mixes string and array. Use * or separate argument." checkConcatenatedDollarAt _ _ = return () prop_checkArrayAsString1 = verify checkArrayAsString "a=$@" prop_checkArrayAsString2 = verify checkArrayAsString "a=\"${arr[@]}\"" prop_checkArrayAsString3 = verify checkArrayAsString "a=*.png" prop_checkArrayAsString4 = verify checkArrayAsString "a={1..10}" prop_checkArrayAsString5 = verifyNot checkArrayAsString "a='*.gif'" prop_checkArrayAsString6 = verifyNot checkArrayAsString "a=$*" prop_checkArrayAsString7 = verifyNot checkArrayAsString "a=( $@ )" checkArrayAsString _ (T_Assignment id _ _ _ word) = if willConcatInAssignment word then warn (getId word) 2124 "Assigning an array to a string! Assign as array, or use * instead of @ to concatenate." else when (willBecomeMultipleArgs word) $ warn (getId word) 2125 "Brace expansions and globs are literal in assignments. Quote it or use an array." checkArrayAsString _ _ = return () prop_checkArrayWithoutIndex1 = verifyTree checkArrayWithoutIndex "foo=(a b); echo $foo" prop_checkArrayWithoutIndex2 = verifyNotTree checkArrayWithoutIndex "foo='bar baz'; foo=($foo); echo ${foo[0]}" prop_checkArrayWithoutIndex3 = verifyTree checkArrayWithoutIndex "coproc foo while true; do echo cow; done; echo $foo" prop_checkArrayWithoutIndex4 = verifyTree checkArrayWithoutIndex "coproc tail -f log; echo $COPROC" prop_checkArrayWithoutIndex5 = verifyTree checkArrayWithoutIndex "a[0]=foo; echo $a" prop_checkArrayWithoutIndex6 = verifyTree checkArrayWithoutIndex "echo $PIPESTATUS" prop_checkArrayWithoutIndex7 = verifyTree checkArrayWithoutIndex "a=(a b); a+=c" prop_checkArrayWithoutIndex8 = verifyTree checkArrayWithoutIndex "declare -a foo; foo=bar;" prop_checkArrayWithoutIndex9 = verifyTree checkArrayWithoutIndex "read -r -a arr <<< 'foo bar'; echo \"$arr\"" prop_checkArrayWithoutIndex10= verifyTree checkArrayWithoutIndex "read -ra arr <<< 'foo bar'; echo \"$arr\"" checkArrayWithoutIndex params _ = doVariableFlowAnalysis readF writeF defaultMap (variableFlow params) where defaultMap = Map.fromList $ map (\x -> (x,())) arrayVariables readF _ (T_DollarBraced id _ token) _ = do map <- get return . maybeToList $ do name <- getLiteralString token assigned <- Map.lookup name map return $ makeComment WarningC id 2128 "Expanding an array without an index only gives the first element." readF _ _ _ = return [] writeF _ (T_Assignment id mode name [] _) _ (DataString _) = do isArray <- gets (isJust . Map.lookup name) return $ if not isArray then [] else case mode of Assign -> [makeComment WarningC id 2178 "Variable was used as an array but is now assigned a string."] Append -> [makeComment WarningC id 2179 "Use array+=(\"item\") to append items to an array."] writeF _ t name (DataArray _) = do modify (Map.insert name ()) return [] writeF _ expr name _ = do if isIndexed expr then modify (Map.insert name ()) else modify (Map.delete name) return [] isIndexed expr = case expr of T_Assignment _ _ _ (_:_) _ -> True _ -> False prop_checkStderrRedirect = verify checkStderrRedirect "test 2>&1 > cow" prop_checkStderrRedirect2 = verifyNot checkStderrRedirect "test > cow 2>&1" prop_checkStderrRedirect3 = verifyNot checkStderrRedirect "test 2>&1 > file | grep stderr" prop_checkStderrRedirect4 = verifyNot checkStderrRedirect "errors=$(test 2>&1 > file)" prop_checkStderrRedirect5 = verifyNot checkStderrRedirect "read < <(test 2>&1 > file)" prop_checkStderrRedirect6 = verify checkStderrRedirect "foo | bar 2>&1 > /dev/null" prop_checkStderrRedirect7 = verifyNot checkStderrRedirect "{ cmd > file; } 2>&1" checkStderrRedirect params redir@(T_Redirecting _ [ T_FdRedirect id "2" (T_IoDuplicate _ (T_GREATAND _) "1"), T_FdRedirect _ _ (T_IoFile _ op _) ] _) = case op of T_Greater _ -> error T_DGREAT _ -> error _ -> return () where usesOutput t = case t of (T_Pipeline _ _ list) -> length list > 1 && not (isParentOf (parentMap params) (last list) redir) T_ProcSub {} -> True T_DollarExpansion {} -> True T_Backticked {} -> True _ -> False isCaptured = any usesOutput $ getPath (parentMap params) redir error = unless isCaptured $ warn id 2069 "To redirect stdout+stderr, 2>&1 must be last (or use '{ cmd > file; } 2>&1' to clarify)." checkStderrRedirect _ _ = return () lt x = trace ("Tracing " ++ show x) x ltt t = trace ("Tracing " ++ show t) prop_checkSingleQuotedVariables = verify checkSingleQuotedVariables "echo '$foo'" prop_checkSingleQuotedVariables2 = verify checkSingleQuotedVariables "echo 'lol$1.jpg'" prop_checkSingleQuotedVariables3 = verifyNot checkSingleQuotedVariables "sed 's/foo$/bar/'" prop_checkSingleQuotedVariables3a= verify checkSingleQuotedVariables "sed 's/${foo}/bar/'" prop_checkSingleQuotedVariables3b= verify checkSingleQuotedVariables "sed 's/$(echo cow)/bar/'" prop_checkSingleQuotedVariables3c= verify checkSingleQuotedVariables "sed 's/$((1+foo))/bar/'" prop_checkSingleQuotedVariables4 = verifyNot checkSingleQuotedVariables "awk '{print $1}'" prop_checkSingleQuotedVariables5 = verifyNot checkSingleQuotedVariables "trap 'echo $SECONDS' EXIT" prop_checkSingleQuotedVariables6 = verifyNot checkSingleQuotedVariables "sed -n '$p'" prop_checkSingleQuotedVariables6a= verify checkSingleQuotedVariables "sed -n '$pattern'" prop_checkSingleQuotedVariables7 = verifyNot checkSingleQuotedVariables "PS1='$PWD \\$ '" prop_checkSingleQuotedVariables8 = verify checkSingleQuotedVariables "find . -exec echo '$1' {} +" prop_checkSingleQuotedVariables9 = verifyNot checkSingleQuotedVariables "find . -exec awk '{print $1}' {} \\;" prop_checkSingleQuotedVariables10= verify checkSingleQuotedVariables "echo '`pwd`'" prop_checkSingleQuotedVariables11= verifyNot checkSingleQuotedVariables "sed '${/lol/d}'" prop_checkSingleQuotedVariables12= verifyNot checkSingleQuotedVariables "eval 'echo $1'" prop_checkSingleQuotedVariables13= verifyNot checkSingleQuotedVariables "busybox awk '{print $1}'" prop_checkSingleQuotedVariables14= verifyNot checkSingleQuotedVariables "[ -v 'bar[$foo]' ]" prop_checkSingleQuotedVariables15= verifyNot checkSingleQuotedVariables "git filter-branch 'test $GIT_COMMIT'" prop_checkSingleQuotedVariables16= verify checkSingleQuotedVariables "git '$a'" prop_checkSingleQuotedVariables17= verifyNot checkSingleQuotedVariables "rename 's/(.)a/$1/g' *" prop_checkSingleQuotedVariables18= verifyNot checkSingleQuotedVariables "echo '``'" prop_checkSingleQuotedVariables19= verifyNot checkSingleQuotedVariables "echo '```'" checkSingleQuotedVariables params t@(T_SingleQuoted id s) = when (s `matches` re) $ if "sed" == commandName then unless (s `matches` sedContra) showMessage else unless isProbablyOk showMessage where parents = parentMap params showMessage = info id 2016 "Expressions don't expand in single quotes, use double quotes for that." commandName = fromMaybe "" $ do cmd <- getClosestCommand parents t name <- getCommandBasename cmd return $ if name == "find" then getFindCommand cmd else if name == "git" then getGitCommand cmd else name isProbablyOk = any isOkAssignment (take 3 $ getPath parents t) || commandName `elem` [ "trap" ,"sh" ,"bash" ,"ksh" ,"zsh" ,"ssh" ,"eval" ,"xprop" ,"alias" ,"sudo" -- covering "sudo sh" and such ,"docker" -- like above ,"dpkg-query" ,"jq" -- could also check that user provides --arg ,"rename" ,"unset" ,"git filter-branch" ] || "awk" `isSuffixOf` commandName || "perl" `isPrefixOf` commandName commonlyQuoted = ["PS1", "PS2", "PS3", "PS4", "PROMPT_COMMAND"] isOkAssignment t = case t of T_Assignment _ _ name _ _ -> name `elem` commonlyQuoted TC_Unary _ _ "-v" _ -> True _ -> False re = mkRegex "\\$[{(0-9a-zA-Z_]|`[^`]+`" sedContra = mkRegex "\\$[{dpsaic]($|[^a-zA-Z])" getFindCommand (T_SimpleCommand _ _ words) = let list = map getLiteralString words cmd = dropWhile (\x -> x /= Just "-exec" && x /= Just "-execdir") list in case cmd of (flag:cmd:rest) -> fromMaybe "find" cmd _ -> "find" getFindCommand (T_Redirecting _ _ cmd) = getFindCommand cmd getFindCommand _ = "find" getGitCommand (T_SimpleCommand _ _ words) = case map getLiteralString words of Just "git":Just "filter-branch":_ -> "git filter-branch" _ -> "git" getGitCommand (T_Redirecting _ _ cmd) = getGitCommand cmd getGitCommand _ = "git" checkSingleQuotedVariables _ _ = return () prop_checkUnquotedN = verify checkUnquotedN "if [ -n $foo ]; then echo cow; fi" prop_checkUnquotedN2 = verify checkUnquotedN "[ -n $cow ]" prop_checkUnquotedN3 = verifyNot checkUnquotedN "[[ -n $foo ]] && echo cow" prop_checkUnquotedN4 = verify checkUnquotedN "[ -n $cow -o -t 1 ]" prop_checkUnquotedN5 = verifyNot checkUnquotedN "[ -n \"$@\" ]" checkUnquotedN _ (TC_Unary _ SingleBracket "-n" (T_NormalWord id [t])) | willSplit t = err id 2070 "-n doesn't work with unquoted arguments. Quote or use [[ ]]." checkUnquotedN _ _ = return () prop_checkNumberComparisons1 = verify checkNumberComparisons "[[ $foo < 3 ]]" prop_checkNumberComparisons2 = verify checkNumberComparisons "[[ 0 >= $(cmd) ]]" prop_checkNumberComparisons3 = verifyNot checkNumberComparisons "[[ $foo ]] > 3" prop_checkNumberComparisons4 = verify checkNumberComparisons "[[ $foo > 2.72 ]]" prop_checkNumberComparisons5 = verify checkNumberComparisons "[[ $foo -le 2.72 ]]" prop_checkNumberComparisons6 = verify checkNumberComparisons "[[ 3.14 -eq $foo ]]" prop_checkNumberComparisons7 = verifyNot checkNumberComparisons "[[ 3.14 == $foo ]]" prop_checkNumberComparisons8 = verify checkNumberComparisons "[ foo <= bar ]" prop_checkNumberComparisons9 = verify checkNumberComparisons "[ foo \\>= bar ]" prop_checkNumberComparisons11 = verify checkNumberComparisons "[ $foo -eq 'N' ]" prop_checkNumberComparisons12 = verify checkNumberComparisons "[ x$foo -gt x${N} ]" prop_checkNumberComparisons13 = verify checkNumberComparisons "[ $foo > $bar ]" prop_checkNumberComparisons14 = verifyNot checkNumberComparisons "[[ foo < bar ]]" prop_checkNumberComparisons15 = verifyNot checkNumberComparisons "[ $foo '>' $bar ]" checkNumberComparisons params (TC_Binary id typ op lhs rhs) = do if isNum lhs || isNum rhs then do when (isLtGt op) $ err id 2071 $ op ++ " is for string comparisons. Use " ++ eqv op ++ " instead." when (isLeGe op && hasStringComparison) $ err id 2071 $ op ++ " is not a valid operator. " ++ "Use " ++ eqv op ++ " ." else do when (isLeGe op || isLtGt op) $ mapM_ checkDecimals [lhs, rhs] when (isLeGe op && hasStringComparison) $ err id 2122 $ op ++ " is not a valid operator. " ++ "Use '! a " ++ esc ++ invert op ++ " b' instead." when (typ == SingleBracket && op `elem` ["<", ">"]) $ case shellType params of Sh -> return () -- These are unsupported and will be caught by bashism checks. Dash -> err id 2073 $ "Escape \\" ++ op ++ " to prevent it redirecting." _ -> err id 2073 $ "Escape \\" ++ op ++ " to prevent it redirecting (or switch to [[ .. ]])." when (op `elem` ["-lt", "-gt", "-le", "-ge", "-eq"]) $ do mapM_ checkDecimals [lhs, rhs] when (typ == SingleBracket) $ checkStrings [lhs, rhs] where hasStringComparison = shellType params /= Sh isLtGt = flip elem ["<", "\\<", ">", "\\>"] isLeGe = flip elem ["<=", "\\<=", ">=", "\\>="] checkDecimals hs = when (isFraction hs && not (hasFloatingPoint params)) $ err (getId hs) 2072 decimalError decimalError = "Decimals are not supported. " ++ "Either use integers only, or use bc or awk to compare." checkStrings = mapM_ stringError . take 1 . filter isNonNum isNonNum t = fromMaybe False $ do s <- getLiteralStringExt (const $ return "") t return . not . all numChar $ s numChar x = isDigit x || x `elem` "+-. " stringError t = err (getId t) 2170 $ "Numerical " ++ op ++ " does not dereference in [..]. Expand or use string operator." isNum t = case oversimplify t of [v] -> all isDigit v _ -> False isFraction t = case oversimplify t of [v] -> isJust $ matchRegex floatRegex v _ -> False eqv ('\\':s) = eqv s eqv "<" = "-lt" eqv ">" = "-gt" eqv "<=" = "-le" eqv ">=" = "-ge" eqv _ = "the numerical equivalent" esc = if typ == SingleBracket then "\\" else "" seqv "-ge" = "! a " ++ esc ++ "< b" seqv "-gt" = esc ++ ">" seqv "-le" = "! a " ++ esc ++ "> b" seqv "-lt" = esc ++ "<" seqv "-eq" = "=" seqv "-ne" = "!=" seqv _ = "the string equivalent" invert ('\\':s) = invert s invert "<=" = ">" invert ">=" = "<" floatRegex = mkRegex "^[-+]?[0-9]+\\.[0-9]+$" checkNumberComparisons _ _ = return () prop_checkSingleBracketOperators1 = verify checkSingleBracketOperators "[ test =~ foo ]" checkSingleBracketOperators params (TC_Binary id SingleBracket "=~" lhs rhs) = when (shellType params `elem` [Bash, Ksh]) $ err id 2074 $ "Can't use =~ in [ ]. Use [[..]] instead." checkSingleBracketOperators _ _ = return () prop_checkDoubleBracketOperators1 = verify checkDoubleBracketOperators "[[ 3 \\< 4 ]]" prop_checkDoubleBracketOperators3 = verifyNot checkDoubleBracketOperators "[[ foo < bar ]]" checkDoubleBracketOperators _ x@(TC_Binary id typ op lhs rhs) | typ == DoubleBracket && op `elem` ["\\<", "\\>"] = err id 2075 $ "Escaping " ++ op ++" is required in [..], but invalid in [[..]]" checkDoubleBracketOperators _ _ = return () prop_checkConditionalAndOrs1 = verify checkConditionalAndOrs "[ foo && bar ]" prop_checkConditionalAndOrs2 = verify checkConditionalAndOrs "[[ foo -o bar ]]" prop_checkConditionalAndOrs3 = verifyNot checkConditionalAndOrs "[[ foo || bar ]]" prop_checkConditionalAndOrs4 = verify checkConditionalAndOrs "[ foo -a bar ]" prop_checkConditionalAndOrs5 = verify checkConditionalAndOrs "[ -z 3 -o a = b ]" checkConditionalAndOrs _ t = case t of (TC_And id SingleBracket "&&" _ _) -> err id 2107 "Instead of [ a && b ], use [ a ] && [ b ]." (TC_And id DoubleBracket "-a" _ _) -> err id 2108 "In [[..]], use && instead of -a." (TC_Or id SingleBracket "||" _ _) -> err id 2109 "Instead of [ a || b ], use [ a ] || [ b ]." (TC_Or id DoubleBracket "-o" _ _) -> err id 2110 "In [[..]], use || instead of -o." (TC_And id SingleBracket "-a" _ _) -> warn id 2166 "Prefer [ p ] && [ q ] as [ p -a q ] is not well defined." (TC_Or id SingleBracket "-o" _ _) -> warn id 2166 "Prefer [ p ] || [ q ] as [ p -o q ] is not well defined." _ -> return () prop_checkQuotedCondRegex1 = verify checkQuotedCondRegex "[[ $foo =~ \"bar.*\" ]]" prop_checkQuotedCondRegex2 = verify checkQuotedCondRegex "[[ $foo =~ '(cow|bar)' ]]" prop_checkQuotedCondRegex3 = verifyNot checkQuotedCondRegex "[[ $foo =~ $foo ]]" prop_checkQuotedCondRegex4 = verifyNot checkQuotedCondRegex "[[ $foo =~ \"bar\" ]]" prop_checkQuotedCondRegex5 = verifyNot checkQuotedCondRegex "[[ $foo =~ 'cow bar' ]]" prop_checkQuotedCondRegex6 = verify checkQuotedCondRegex "[[ $foo =~ 'cow|bar' ]]" checkQuotedCondRegex _ (TC_Binary _ _ "=~" _ rhs) = case rhs of T_NormalWord id [T_DoubleQuoted _ _] -> error rhs T_NormalWord id [T_SingleQuoted _ _] -> error rhs _ -> return () where error t = unless (isConstantNonRe t) $ err (getId t) 2076 "Don't quote right-hand side of =~, it'll match literally rather than as a regex." re = mkRegex "[][*.+()|]" hasMetachars s = s `matches` re isConstantNonRe t = fromMaybe False $ do s <- getLiteralString t return . not $ hasMetachars s checkQuotedCondRegex _ _ = return () prop_checkGlobbedRegex1 = verify checkGlobbedRegex "[[ $foo =~ *foo* ]]" prop_checkGlobbedRegex2 = verify checkGlobbedRegex "[[ $foo =~ f* ]]" prop_checkGlobbedRegex3 = verifyNot checkGlobbedRegex "[[ $foo =~ $foo ]]" prop_checkGlobbedRegex4 = verifyNot checkGlobbedRegex "[[ $foo =~ ^c.* ]]" prop_checkGlobbedRegex5 = verifyNot checkGlobbedRegex "[[ $foo =~ \\* ]]" prop_checkGlobbedRegex6 = verifyNot checkGlobbedRegex "[[ $foo =~ (o*) ]]" prop_checkGlobbedRegex7 = verifyNot checkGlobbedRegex "[[ $foo =~ \\*foo ]]" prop_checkGlobbedRegex8 = verifyNot checkGlobbedRegex "[[ $foo =~ x\\* ]]" checkGlobbedRegex _ (TC_Binary _ DoubleBracket "=~" _ rhs) = let s = concat $ oversimplify rhs in when (isConfusedGlobRegex s) $ warn (getId rhs) 2049 "=~ is for regex, but this looks like a glob. Use = instead." checkGlobbedRegex _ _ = return () prop_checkConstantIfs1 = verify checkConstantIfs "[[ foo != bar ]]" prop_checkConstantIfs2a= verify checkConstantIfs "[ n -le 4 ]" prop_checkConstantIfs2b= verifyNot checkConstantIfs "[[ n -le 4 ]]" prop_checkConstantIfs3 = verify checkConstantIfs "[[ $n -le 4 && n != 2 ]]" prop_checkConstantIfs4 = verifyNot checkConstantIfs "[[ $n -le 3 ]]" prop_checkConstantIfs5 = verifyNot checkConstantIfs "[[ $n -le $n ]]" prop_checkConstantIfs6 = verifyNot checkConstantIfs "[[ a -ot b ]]" prop_checkConstantIfs7 = verifyNot checkConstantIfs "[ a -nt b ]" prop_checkConstantIfs8 = verifyNot checkConstantIfs "[[ ~foo == '~foo' ]]" prop_checkConstantIfs9 = verify checkConstantIfs "[[ *.png == [a-z] ]]" checkConstantIfs _ (TC_Binary id typ op lhs rhs) | not isDynamic = if isConstant lhs && isConstant rhs then warn id 2050 "This expression is constant. Did you forget the $ on a variable?" else checkUnmatchable id op lhs rhs where isDynamic = op `elem` [ "-lt", "-gt", "-le", "-ge", "-eq", "-ne" ] && typ == DoubleBracket || op `elem` [ "-nt", "-ot", "-ef"] checkUnmatchable id op lhs rhs = when (op `elem` ["=", "==", "!="] && not (wordsCanBeEqual lhs rhs)) $ warn id 2193 "The arguments to this comparison can never be equal. Make sure your syntax is correct." checkConstantIfs _ _ = return () prop_checkLiteralBreakingTest = verify checkLiteralBreakingTest "[[ a==$foo ]]" prop_checkLiteralBreakingTest2 = verify checkLiteralBreakingTest "[ $foo=3 ]" prop_checkLiteralBreakingTest3 = verify checkLiteralBreakingTest "[ $foo!=3 ]" prop_checkLiteralBreakingTest4 = verify checkLiteralBreakingTest "[ \"$(ls) \" ]" prop_checkLiteralBreakingTest5 = verify checkLiteralBreakingTest "[ -n \"$(true) \" ]" prop_checkLiteralBreakingTest6 = verify checkLiteralBreakingTest "[ -z $(true)z ]" prop_checkLiteralBreakingTest7 = verifyNot checkLiteralBreakingTest "[ -z $(true) ]" prop_checkLiteralBreakingTest8 = verifyNot checkLiteralBreakingTest "[ $(true)$(true) ]" prop_checkLiteralBreakingTest10 = verify checkLiteralBreakingTest "[ -z foo ]" checkLiteralBreakingTest _ t = potentially $ case t of (TC_Nullary _ _ w@(T_NormalWord _ l)) -> do guard . not $ isConstant w -- Covered by SC2078 comparisonWarning l `mplus` tautologyWarning w "Argument to implicit -n is always true due to literal strings." (TC_Unary _ _ op w@(T_NormalWord _ l)) -> case op of "-n" -> tautologyWarning w "Argument to -n is always true due to literal strings." "-z" -> tautologyWarning w "Argument to -z is always false due to literal strings." _ -> fail "not relevant" _ -> fail "not my problem" where hasEquals = matchToken ('=' `elem`) isNonEmpty = matchToken (not . null) matchToken m t = isJust $ do str <- getLiteralString t guard $ m str return () comparisonWarning list = do token <- listToMaybe $ filter hasEquals list return $ err (getId token) 2077 "You need spaces around the comparison operator." tautologyWarning t s = do token <- listToMaybe $ filter isNonEmpty $ getWordParts t return $ err (getId token) 2157 s prop_checkConstantNullary = verify checkConstantNullary "[[ '$(foo)' ]]" prop_checkConstantNullary2 = verify checkConstantNullary "[ \"-f lol\" ]" prop_checkConstantNullary3 = verify checkConstantNullary "[[ cmd ]]" prop_checkConstantNullary4 = verify checkConstantNullary "[[ ! cmd ]]" prop_checkConstantNullary5 = verify checkConstantNullary "[[ true ]]" prop_checkConstantNullary6 = verify checkConstantNullary "[ 1 ]" prop_checkConstantNullary7 = verify checkConstantNullary "[ false ]" checkConstantNullary _ (TC_Nullary _ _ t) | isConstant t = case fromMaybe "" $ getLiteralString t of "false" -> err (getId t) 2158 "[ false ] is true. Remove the brackets." "0" -> err (getId t) 2159 "[ 0 ] is true. Use 'false' instead." "true" -> style (getId t) 2160 "Instead of '[ true ]', just use 'true'." "1" -> style (getId t) 2161 "Instead of '[ 1 ]', use 'true'." _ -> err (getId t) 2078 "This expression is constant. Did you forget a $ somewhere?" where string = fromMaybe "" $ getLiteralString t checkConstantNullary _ _ = return () prop_checkForDecimals1 = verify checkForDecimals "((3.14*c))" prop_checkForDecimals2 = verify checkForDecimals "foo[1.2]=bar" prop_checkForDecimals3 = verifyNot checkForDecimals "declare -A foo; foo[1.2]=bar" checkForDecimals params t@(TA_Expansion id _) = potentially $ do guard $ not (hasFloatingPoint params) str <- getLiteralString t first <- str !!! 0 guard $ isDigit first && '.' `elem` str return $ err id 2079 "(( )) doesn't support decimals. Use bc or awk." checkForDecimals _ _ = return () prop_checkDivBeforeMult = verify checkDivBeforeMult "echo $((c/n*100))" prop_checkDivBeforeMult2 = verifyNot checkDivBeforeMult "echo $((c*100/n))" prop_checkDivBeforeMult3 = verifyNot checkDivBeforeMult "echo $((c/10*10))" checkDivBeforeMult params (TA_Binary _ "*" (TA_Binary id "/" _ x) y) | not (hasFloatingPoint params) && x /= y = info id 2017 "Increase precision by replacing a/b*c with a*c/b." checkDivBeforeMult _ _ = return () prop_checkArithmeticDeref = verify checkArithmeticDeref "echo $((3+$foo))" prop_checkArithmeticDeref2 = verify checkArithmeticDeref "cow=14; (( s+= $cow ))" prop_checkArithmeticDeref3 = verifyNot checkArithmeticDeref "cow=1/40; (( s+= ${cow%%/*} ))" prop_checkArithmeticDeref4 = verifyNot checkArithmeticDeref "(( ! $? ))" prop_checkArithmeticDeref5 = verifyNot checkArithmeticDeref "(($1))" prop_checkArithmeticDeref6 = verify checkArithmeticDeref "(( a[$i] ))" prop_checkArithmeticDeref7 = verifyNot checkArithmeticDeref "(( 10#$n ))" prop_checkArithmeticDeref8 = verifyNot checkArithmeticDeref "let i=$i+1" prop_checkArithmeticDeref9 = verifyNot checkArithmeticDeref "(( a[foo] ))" prop_checkArithmeticDeref10= verifyNot checkArithmeticDeref "(( a[\\$foo] ))" prop_checkArithmeticDeref11= verifyNot checkArithmeticDeref "a[$foo]=wee" prop_checkArithmeticDeref12= verify checkArithmeticDeref "for ((i=0; $i < 3; i)); do true; done" prop_checkArithmeticDeref13= verifyNot checkArithmeticDeref "(( $$ ))" prop_checkArithmeticDeref14= verifyNot checkArithmeticDeref "(( $! ))" prop_checkArithmeticDeref15= verifyNot checkArithmeticDeref "(( ${!var} ))" prop_checkArithmeticDeref16= verifyNot checkArithmeticDeref "(( ${x+1} + ${x=42} ))" checkArithmeticDeref params t@(TA_Expansion _ [b@(T_DollarBraced id _ _)]) = unless (isException $ bracedString b) getWarning where isException [] = True isException s = any (`elem` "/.:#%?*@$-!+=^,") s || isDigit (head s) getWarning = fromMaybe noWarning . msum . map warningFor $ parents params t warningFor t = case t of T_Arithmetic {} -> return normalWarning T_DollarArithmetic {} -> return normalWarning T_ForArithmetic {} -> return normalWarning T_SimpleCommand {} -> return noWarning _ -> Nothing normalWarning = style id 2004 "$/${} is unnecessary on arithmetic variables." noWarning = return () checkArithmeticDeref _ _ = return () prop_checkArithmeticBadOctal1 = verify checkArithmeticBadOctal "(( 0192 ))" prop_checkArithmeticBadOctal2 = verifyNot checkArithmeticBadOctal "(( 0x192 ))" prop_checkArithmeticBadOctal3 = verifyNot checkArithmeticBadOctal "(( 1 ^ 0777 ))" checkArithmeticBadOctal _ t@(TA_Expansion id _) = potentially $ do str <- getLiteralString t guard $ str `matches` octalRE return $ err id 2080 "Numbers with leading 0 are considered octal." where octalRE = mkRegex "^0[0-7]*[8-9]" checkArithmeticBadOctal _ _ = return () prop_checkComparisonAgainstGlob = verify checkComparisonAgainstGlob "[[ $cow == $bar ]]" prop_checkComparisonAgainstGlob2 = verifyNot checkComparisonAgainstGlob "[[ $cow == \"$bar\" ]]" prop_checkComparisonAgainstGlob3 = verify checkComparisonAgainstGlob "[ $cow = *foo* ]" prop_checkComparisonAgainstGlob4 = verifyNot checkComparisonAgainstGlob "[ $cow = foo ]" prop_checkComparisonAgainstGlob5 = verify checkComparisonAgainstGlob "[[ $cow != $bar ]]" prop_checkComparisonAgainstGlob6 = verify checkComparisonAgainstGlob "[ $f != /* ]" checkComparisonAgainstGlob _ (TC_Binary _ DoubleBracket op _ (T_NormalWord id [T_DollarBraced _ _ _])) | op `elem` ["=", "==", "!="] = warn id 2053 $ "Quote the right-hand side of " ++ op ++ " in [[ ]] to prevent glob matching." checkComparisonAgainstGlob params (TC_Binary _ SingleBracket op _ word) | op `elem` ["=", "==", "!="] && isGlob word = err (getId word) 2081 msg where msg = if isBashLike params then "[ .. ] can't match globs. Use [[ .. ]] or case statement." else "[ .. ] can't match globs. Use a case statement." checkComparisonAgainstGlob _ _ = return () prop_checkCommarrays1 = verify checkCommarrays "a=(1, 2)" prop_checkCommarrays2 = verify checkCommarrays "a+=(1,2,3)" prop_checkCommarrays3 = verifyNot checkCommarrays "cow=(1 \"foo,bar\" 3)" prop_checkCommarrays4 = verifyNot checkCommarrays "cow=('one,' 'two')" prop_checkCommarrays5 = verify checkCommarrays "a=([a]=b, [c]=d)" prop_checkCommarrays6 = verify checkCommarrays "a=([a]=b,[c]=d,[e]=f)" prop_checkCommarrays7 = verify checkCommarrays "a=(1,2)" checkCommarrays _ (T_Array id l) = when (any (isCommaSeparated . literal) l) $ warn id 2054 "Use spaces, not commas, to separate array elements." where literal (T_IndexedElement _ _ l) = literal l literal (T_NormalWord _ l) = concatMap literal l literal (T_Literal _ str) = str literal _ = "" isCommaSeparated = elem ',' checkCommarrays _ _ = return () prop_checkOrNeq1 = verify checkOrNeq "if [[ $lol -ne cow || $lol -ne foo ]]; then echo foo; fi" prop_checkOrNeq2 = verify checkOrNeq "(( a!=lol || a!=foo ))" prop_checkOrNeq3 = verify checkOrNeq "[ \"$a\" != lol || \"$a\" != foo ]" prop_checkOrNeq4 = verifyNot checkOrNeq "[ a != $cow || b != $foo ]" prop_checkOrNeq5 = verifyNot checkOrNeq "[[ $a != /home || $a != */public_html/* ]]" prop_checkOrNeq6 = verify checkOrNeq "[ $a != a ] || [ $a != b ]" prop_checkOrNeq7 = verify checkOrNeq "[ $a != a ] || [ $a != b ] || true" prop_checkOrNeq8 = verifyNot checkOrNeq "[[ $a != x || $a != x ]]" -- This only catches the most idiomatic cases. Fixme? -- For test-level "or": [ x != y -o x != z ] checkOrNeq _ (TC_Or id typ op (TC_Binary _ _ op1 lhs1 rhs1 ) (TC_Binary _ _ op2 lhs2 rhs2)) | (op1 == op2 && (op1 == "-ne" || op1 == "!=")) && lhs1 == lhs2 && rhs1 /= rhs2 && not (any isGlob [rhs1,rhs2]) = warn id 2055 $ "You probably wanted " ++ (if typ == SingleBracket then "-a" else "&&") ++ " here, otherwise it's always true." -- For arithmetic context "or" checkOrNeq _ (TA_Binary id "||" (TA_Binary _ "!=" word1 _) (TA_Binary _ "!=" word2 _)) | word1 == word2 = warn id 2056 "You probably wanted && here, otherwise it's always true." -- For command level "or": [ x != y ] || [ x != z ] checkOrNeq _ (T_OrIf id lhs rhs) = potentially $ do (lhs1, op1, rhs1) <- getExpr lhs (lhs2, op2, rhs2) <- getExpr rhs guard $ op1 == op2 && op1 `elem` ["-ne", "!="] guard $ lhs1 == lhs2 && rhs1 /= rhs2 guard . not $ any isGlob [rhs1, rhs2] return $ warn id 2252 "You probably wanted && here, otherwise it's always true." where getExpr x = case x of T_OrIf _ lhs _ -> getExpr lhs -- Fetches x and y in `T_OrIf x (T_OrIf y z)` T_Pipeline _ _ [x] -> getExpr x T_Redirecting _ _ c -> getExpr c T_Condition _ _ c -> getExpr c TC_Binary _ _ op lhs rhs -> return (lhs, op, rhs) _ -> fail "" checkOrNeq _ _ = return () prop_checkValidCondOps1 = verify checkValidCondOps "[[ a -xz b ]]" prop_checkValidCondOps2 = verify checkValidCondOps "[ -M a ]" prop_checkValidCondOps2a= verifyNot checkValidCondOps "[ 3 \\> 2 ]" prop_checkValidCondOps3 = verifyNot checkValidCondOps "[ 1 = 2 -a 3 -ge 4 ]" prop_checkValidCondOps4 = verifyNot checkValidCondOps "[[ ! -v foo ]]" checkValidCondOps _ (TC_Binary id _ s _ _) | s `notElem` binaryTestOps = warn id 2057 "Unknown binary operator." checkValidCondOps _ (TC_Unary id _ s _) | s `notElem` unaryTestOps = warn id 2058 "Unknown unary operator." checkValidCondOps _ _ = return () prop_checkUuoeVar1 = verify checkUuoeVar "for f in $(echo $tmp); do echo lol; done" prop_checkUuoeVar2 = verify checkUuoeVar "date +`echo \"$format\"`" prop_checkUuoeVar3 = verifyNot checkUuoeVar "foo \"$(echo -e '\r')\"" prop_checkUuoeVar4 = verifyNot checkUuoeVar "echo $tmp" prop_checkUuoeVar5 = verify checkUuoeVar "foo \"$(echo \"$(date) value:\" $value)\"" prop_checkUuoeVar6 = verifyNot checkUuoeVar "foo \"$(echo files: *.png)\"" prop_checkUuoeVar7 = verifyNot checkUuoeVar "foo $(echo $(bar))" -- covered by 2005 prop_checkUuoeVar8 = verifyNot checkUuoeVar "#!/bin/sh\nz=$(echo)" prop_checkUuoeVar9 = verify checkUuoeVar "foo $(echo $( check id cmd T_DollarExpansion id [cmd] -> check id cmd _ -> return () where couldBeOptimized f = case f of T_Glob {} -> False T_Extglob {} -> False T_BraceExpansion {} -> False T_NormalWord _ l -> all couldBeOptimized l T_DoubleQuoted _ l -> all couldBeOptimized l _ -> True check id (T_Pipeline _ _ [T_Redirecting _ _ c]) = warnForEcho id c check _ _ = return () isCovered first rest = null rest && tokenIsJustCommandOutput first warnForEcho id = checkUnqualifiedCommand "echo" $ \_ vars -> case vars of (first:rest) -> unless (isCovered first rest || "-" `isPrefixOf` onlyLiteralString first) $ when (all couldBeOptimized vars) $ style id 2116 "Useless echo? Instead of 'cmd $(echo foo)', just use 'cmd foo'." _ -> return () prop_checkTestRedirects1 = verify checkTestRedirects "test 3 > 1" prop_checkTestRedirects2 = verifyNot checkTestRedirects "test 3 \\> 1" prop_checkTestRedirects3 = verify checkTestRedirects "/usr/bin/test $var > $foo" prop_checkTestRedirects4 = verifyNot checkTestRedirects "test 1 -eq 2 2> file" checkTestRedirects _ (T_Redirecting id redirs cmd) | cmd `isCommand` "test" = mapM_ check redirs where check t = when (suspicious t) $ warn (getId t) 2065 "This is interpreted as a shell file redirection, not a comparison." suspicious t = -- Ignore redirections of stderr because these are valid for squashing e.g. int errors, case t of -- and >> and similar redirections because these are probably not comparisons. T_FdRedirect _ fd (T_IoFile _ op _) -> fd /= "2" && isComparison op _ -> False isComparison t = case t of T_Greater _ -> True T_Less _ -> True _ -> False checkTestRedirects _ _ = return () prop_checkPS11 = verify checkPS1Assignments "PS1='\\033[1;35m\\$ '" prop_checkPS11a= verify checkPS1Assignments "export PS1='\\033[1;35m\\$ '" prop_checkPSf2 = verify checkPS1Assignments "PS1='\\h \\e[0m\\$ '" prop_checkPS13 = verify checkPS1Assignments "PS1=$'\\x1b[c '" prop_checkPS14 = verify checkPS1Assignments "PS1=$'\\e[3m; '" prop_checkPS14a= verify checkPS1Assignments "export PS1=$'\\e[3m; '" prop_checkPS15 = verifyNot checkPS1Assignments "PS1='\\[\\033[1;35m\\]\\$ '" prop_checkPS16 = verifyNot checkPS1Assignments "PS1='\\[\\e1m\\e[1m\\]\\$ '" prop_checkPS17 = verifyNot checkPS1Assignments "PS1='e033x1B'" prop_checkPS18 = verifyNot checkPS1Assignments "PS1='\\[\\e\\]'" checkPS1Assignments _ (T_Assignment _ _ "PS1" _ word) = warnFor word where warnFor word = let contents = concat $ oversimplify word in when (containsUnescaped contents) $ info (getId word) 2025 "Make sure all escape sequences are enclosed in \\[..\\] to prevent line wrapping issues" containsUnescaped s = let unenclosed = subRegex enclosedRegex s "" in isJust $ matchRegex escapeRegex unenclosed enclosedRegex = mkRegex "\\\\\\[.*\\\\\\]" -- FIXME: shouldn't be eager escapeRegex = mkRegex "\\\\x1[Bb]|\\\\e|\x1B|\\\\033" checkPS1Assignments _ _ = return () prop_checkBackticks1 = verify checkBackticks "echo `foo`" prop_checkBackticks2 = verifyNot checkBackticks "echo $(foo)" prop_checkBackticks3 = verifyNot checkBackticks "echo `#inlined comment` foo" checkBackticks params (T_Backticked id list) | not (null list) = addComment $ makeCommentWithFix StyleC id 2006 "Use $(...) notation instead of legacy backticked `...`." (fixWith [replaceStart id params 1 "$(", replaceEnd id params 1 ")"]) checkBackticks _ _ = return () prop_checkIndirectExpansion1 = verify checkIndirectExpansion "${foo$n}" prop_checkIndirectExpansion2 = verifyNot checkIndirectExpansion "${foo//$n/lol}" prop_checkIndirectExpansion3 = verify checkIndirectExpansion "${$#}" prop_checkIndirectExpansion4 = verify checkIndirectExpansion "${var${n}_$((i%2))}" prop_checkIndirectExpansion5 = verifyNot checkIndirectExpansion "${bar}" checkIndirectExpansion _ (T_DollarBraced i _ (T_NormalWord _ contents)) = when (isIndirection contents) $ err i 2082 "To expand via indirection, use arrays, ${!name} or (for sh only) eval." where isIndirection vars = let list = mapMaybe isIndirectionPart vars in not (null list) && and list isIndirectionPart t = case t of T_DollarExpansion _ _ -> Just True T_Backticked _ _ -> Just True T_DollarBraced _ _ _ -> Just True T_DollarArithmetic _ _ -> Just True T_Literal _ s -> if all isVariableChar s then Nothing else Just False _ -> Just False checkIndirectExpansion _ _ = return () prop_checkInexplicablyUnquoted1 = verify checkInexplicablyUnquoted "echo 'var='value';'" prop_checkInexplicablyUnquoted2 = verifyNot checkInexplicablyUnquoted "'foo'*" prop_checkInexplicablyUnquoted3 = verifyNot checkInexplicablyUnquoted "wget --user-agent='something'" prop_checkInexplicablyUnquoted4 = verify checkInexplicablyUnquoted "echo \"VALUES (\"id\")\"" prop_checkInexplicablyUnquoted5 = verifyNot checkInexplicablyUnquoted "\"$dir\"/\"$file\"" prop_checkInexplicablyUnquoted6 = verifyNot checkInexplicablyUnquoted "\"$dir\"some_stuff\"$file\"" prop_checkInexplicablyUnquoted7 = verifyNot checkInexplicablyUnquoted "${dir/\"foo\"/\"bar\"}" prop_checkInexplicablyUnquoted8 = verifyNot checkInexplicablyUnquoted " 'foo'\\\n 'bar'" prop_checkInexplicablyUnquoted9 = verifyNot checkInexplicablyUnquoted "[[ $x =~ \"foo\"(\"bar\"|\"baz\") ]]" checkInexplicablyUnquoted params (T_NormalWord id tokens) = mapM_ check (tails tokens) where check (T_SingleQuoted _ _:T_Literal id str:_) | not (null str) && all isAlphaNum str = info id 2026 "This word is outside of quotes. Did you intend to 'nest '\"'single quotes'\"' instead'? " check (T_DoubleQuoted _ a:trapped:T_DoubleQuoted _ b:_) = case trapped of T_DollarExpansion id _ -> warnAboutExpansion id T_DollarBraced id _ _ -> warnAboutExpansion id T_Literal id s -> unless (quotesSingleThing a && quotesSingleThing b || isRegex (getPath (parentMap params) trapped)) $ warnAboutLiteral id _ -> return () check _ = return () -- Regexes for [[ .. =~ re ]] are parsed with metacharacters like ()| as unquoted -- literals, so avoid overtriggering on these. isRegex t = case t of (T_Redirecting {} : _) -> False (a:(TC_Binary _ _ "=~" lhs rhs):rest) -> getId a == getId rhs _:rest -> isRegex rest _ -> False -- If the surrounding quotes quote single things, like "$foo"_and_then_some_"$stuff", -- the quotes were probably intentional and harmless. quotesSingleThing x = case x of [T_DollarExpansion _ _] -> True [T_DollarBraced _ _ _] -> True [T_Backticked _ _] -> True _ -> False warnAboutExpansion id = warn id 2027 "The surrounding quotes actually unquote this. Remove or escape them." warnAboutLiteral id = warn id 2140 "Word is of the form \"A\"B\"C\" (B indicated). Did you mean \"ABC\" or \"A\\\"B\\\"C\"?" checkInexplicablyUnquoted _ _ = return () prop_checkTildeInQuotes1 = verify checkTildeInQuotes "var=\"~/out.txt\"" prop_checkTildeInQuotes2 = verify checkTildeInQuotes "foo > '~/dir'" prop_checkTildeInQuotes4 = verifyNot checkTildeInQuotes "~/file" prop_checkTildeInQuotes5 = verifyNot checkTildeInQuotes "echo '/~foo/cow'" prop_checkTildeInQuotes6 = verifyNot checkTildeInQuotes "awk '$0 ~ /foo/'" checkTildeInQuotes _ = check where verify id ('~':'/':_) = warn id 2088 "Tilde does not expand in quotes. Use $HOME." verify _ _ = return () check (T_NormalWord _ (T_SingleQuoted id str:_)) = verify id str check (T_NormalWord _ (T_DoubleQuoted _ (T_Literal id str:_):_)) = verify id str check _ = return () prop_checkLonelyDotDash1 = verify checkLonelyDotDash "./ file" prop_checkLonelyDotDash2 = verifyNot checkLonelyDotDash "./file" checkLonelyDotDash _ t@(T_Redirecting id _ _) | isUnqualifiedCommand t "./" = err id 2083 "Don't add spaces after the slash in './file'." checkLonelyDotDash _ _ = return () prop_checkSpuriousExec1 = verify checkSpuriousExec "exec foo; true" prop_checkSpuriousExec2 = verify checkSpuriousExec "if a; then exec b; exec c; fi" prop_checkSpuriousExec3 = verifyNot checkSpuriousExec "echo cow; exec foo" prop_checkSpuriousExec4 = verifyNot checkSpuriousExec "if a; then exec b; fi" prop_checkSpuriousExec5 = verifyNot checkSpuriousExec "exec > file; cmd" prop_checkSpuriousExec6 = verify checkSpuriousExec "exec foo > file; cmd" prop_checkSpuriousExec7 = verifyNot checkSpuriousExec "exec file; echo failed; exit 3" prop_checkSpuriousExec8 = verifyNot checkSpuriousExec "exec {origout}>&1- >tmp.log 2>&1; bar" prop_checkSpuriousExec9 = verify checkSpuriousExec "for file in rc.d/*; do exec \"$file\"; done" checkSpuriousExec _ = doLists where doLists (T_Script _ _ cmds) = doList cmds False doLists (T_BraceGroup _ cmds) = doList cmds False doLists (T_WhileExpression _ _ cmds) = doList cmds True doLists (T_UntilExpression _ _ cmds) = doList cmds True doLists (T_ForIn _ _ _ cmds) = doList cmds True doLists (T_ForArithmetic _ _ _ _ cmds) = doList cmds True doLists (T_IfExpression _ thens elses) = do mapM_ (\(_, l) -> doList l False) thens doList elses False doLists _ = return () stripCleanup = reverse . dropWhile cleanup . reverse cleanup (T_Pipeline _ _ [cmd]) = isCommandMatch cmd (`elem` ["echo", "exit"]) cleanup _ = False doList = doList' . stripCleanup -- The second parameter is True if we are in a loop -- In that case we should emit the warning also if `exec' is the last statement doList' t@(current:following:_) False = do commentIfExec current doList (tail t) False doList' (current:tail) True = do commentIfExec current doList tail True doList' _ _ = return () commentIfExec (T_Pipeline id _ list) = mapM_ commentIfExec $ take 1 list commentIfExec (T_Redirecting _ _ f@( T_SimpleCommand id _ (cmd:arg:_))) = when (f `isUnqualifiedCommand` "exec") $ warn id 2093 "Remove \"exec \" if script should continue after this command." commentIfExec _ = return () prop_checkSpuriousExpansion1 = verify checkSpuriousExpansion "if $(true); then true; fi" prop_checkSpuriousExpansion2 = verify checkSpuriousExpansion "while \"$(cmd)\"; do :; done" prop_checkSpuriousExpansion3 = verifyNot checkSpuriousExpansion "$(cmd) --flag1 --flag2" prop_checkSpuriousExpansion4 = verify checkSpuriousExpansion "$((i++))" checkSpuriousExpansion _ (T_SimpleCommand _ _ [T_NormalWord _ [word]]) = check word where check word = case word of T_DollarExpansion id _ -> warn id 2091 "Remove surrounding $() to avoid executing output." T_Backticked id _ -> warn id 2092 "Remove backticks to avoid executing output." T_DollarArithmetic id _ -> err id 2084 "Remove '$' or use '_=$((expr))' to avoid executing output." T_DoubleQuoted id [subword] -> check subword _ -> return () checkSpuriousExpansion _ _ = return () prop_checkDollarBrackets1 = verify checkDollarBrackets "echo $[1+2]" prop_checkDollarBrackets2 = verifyNot checkDollarBrackets "echo $((1+2))" checkDollarBrackets _ (T_DollarBracket id _) = style id 2007 "Use $((..)) instead of deprecated $[..]" checkDollarBrackets _ _ = return () prop_checkSshHereDoc1 = verify checkSshHereDoc "ssh host << foo\necho $PATH\nfoo" prop_checkSshHereDoc2 = verifyNot checkSshHereDoc "ssh host << 'foo'\necho $PATH\nfoo" checkSshHereDoc _ (T_Redirecting _ redirs cmd) | cmd `isCommand` "ssh" = mapM_ checkHereDoc redirs where hasVariables = mkRegex "[`$]" checkHereDoc (T_FdRedirect _ _ (T_HereDoc id _ Unquoted token tokens)) | not (all isConstant tokens) = warn id 2087 $ "Quote '" ++ token ++ "' to make here document expansions happen on the server side rather than on the client." checkHereDoc _ = return () checkSshHereDoc _ _ = return () --- Subshell detection prop_subshellAssignmentCheck = verifyTree subshellAssignmentCheck "cat foo | while read bar; do a=$bar; done; echo \"$a\"" prop_subshellAssignmentCheck2 = verifyNotTree subshellAssignmentCheck "while read bar; do a=$bar; done < file; echo \"$a\"" prop_subshellAssignmentCheck3 = verifyTree subshellAssignmentCheck "( A=foo; ); rm $A" prop_subshellAssignmentCheck4 = verifyNotTree subshellAssignmentCheck "( A=foo; rm $A; )" prop_subshellAssignmentCheck5 = verifyTree subshellAssignmentCheck "cat foo | while read cow; do true; done; echo $cow;" prop_subshellAssignmentCheck6 = verifyTree subshellAssignmentCheck "( export lol=$(ls); ); echo $lol;" prop_subshellAssignmentCheck6a= verifyTree subshellAssignmentCheck "( typeset -a lol=a; ); echo $lol;" prop_subshellAssignmentCheck7 = verifyTree subshellAssignmentCheck "cmd | while read foo; do (( n++ )); done; echo \"$n lines\"" prop_subshellAssignmentCheck8 = verifyTree subshellAssignmentCheck "n=3 & echo $((n++))" prop_subshellAssignmentCheck9 = verifyTree subshellAssignmentCheck "read n & n=foo$n" prop_subshellAssignmentCheck10 = verifyTree subshellAssignmentCheck "(( n <<= 3 )) & (( n |= 4 )) &" prop_subshellAssignmentCheck11 = verifyTree subshellAssignmentCheck "cat /etc/passwd | while read line; do let n=n+1; done\necho $n" prop_subshellAssignmentCheck12 = verifyTree subshellAssignmentCheck "cat /etc/passwd | while read line; do let ++n; done\necho $n" prop_subshellAssignmentCheck13 = verifyTree subshellAssignmentCheck "#!/bin/bash\necho foo | read bar; echo $bar" prop_subshellAssignmentCheck14 = verifyNotTree subshellAssignmentCheck "#!/bin/ksh93\necho foo | read bar; echo $bar" prop_subshellAssignmentCheck15 = verifyNotTree subshellAssignmentCheck "#!/bin/ksh\ncat foo | while read bar; do a=$bar; done\necho \"$a\"" prop_subshellAssignmentCheck16 = verifyNotTree subshellAssignmentCheck "(set -e); echo $@" prop_subshellAssignmentCheck17 = verifyNotTree subshellAssignmentCheck "foo=${ { bar=$(baz); } 2>&1; }; echo $foo $bar" prop_subshellAssignmentCheck18 = verifyTree subshellAssignmentCheck "( exec {n}>&2; ); echo $n" prop_subshellAssignmentCheck19 = verifyNotTree subshellAssignmentCheck "#!/bin/bash\nshopt -s lastpipe; echo a | read -r b; echo \"$b\"" prop_subshellAssignmentCheck20 = verifyTree subshellAssignmentCheck "@test 'foo' { a=1; }\n@test 'bar' { echo $a; }\n" subshellAssignmentCheck params t = let flow = variableFlow params check = findSubshelled flow [("oops",[])] Map.empty in execWriter check findSubshelled [] _ _ = return () findSubshelled (Assignment x@(_, _, str, _):rest) ((reason,scope):lol) deadVars = findSubshelled rest ((reason, x:scope):lol) $ Map.insert str Alive deadVars findSubshelled (Reference (_, readToken, str):rest) scopes deadVars = do unless (shouldIgnore str) $ case Map.findWithDefault Alive str deadVars of Alive -> return () Dead writeToken reason -> do info (getId writeToken) 2030 $ "Modification of " ++ str ++ " is local (to subshell caused by "++ reason ++")." info (getId readToken) 2031 $ str ++ " was modified in a subshell. That change might be lost." findSubshelled rest scopes deadVars where shouldIgnore str = str `elem` ["@", "*", "IFS"] findSubshelled (StackScope (SubshellScope reason):rest) scopes deadVars = findSubshelled rest ((reason,[]):scopes) deadVars findSubshelled (StackScopeEnd:rest) ((reason, scope):oldScopes) deadVars = findSubshelled rest oldScopes $ foldl (\m (_, token, var, _) -> Map.insert var (Dead token reason) m) deadVars scope -- FIXME: This is a very strange way of doing it. -- For each variable read/write, run a stateful function that emits -- comments. The comments are collected and returned. doVariableFlowAnalysis :: (Token -> Token -> String -> State t [v]) -> (Token -> Token -> String -> DataType -> State t [v]) -> t -> [StackData] -> [v] doVariableFlowAnalysis readFunc writeFunc empty flow = evalState ( foldM (\list x -> do { l <- doFlow x; return $ l ++ list; }) [] flow ) empty where doFlow (Reference (base, token, name)) = readFunc base token name doFlow (Assignment (base, token, name, values)) = writeFunc base token name values doFlow _ = return [] ---- Check whether variables could have spaces/globs prop_checkSpacefulness1 = verifyTree checkSpacefulness "a='cow moo'; echo $a" prop_checkSpacefulness2 = verifyNotTree checkSpacefulness "a='cow moo'; [[ $a ]]" prop_checkSpacefulness3 = verifyNotTree checkSpacefulness "a='cow*.mp3'; echo \"$a\"" prop_checkSpacefulness4 = verifyTree checkSpacefulness "for f in *.mp3; do echo $f; done" prop_checkSpacefulness4a= verifyNotTree checkSpacefulness "foo=3; foo=$(echo $foo)" prop_checkSpacefulness5 = verifyTree checkSpacefulness "a='*'; b=$a; c=lol${b//foo/bar}; echo $c" prop_checkSpacefulness6 = verifyTree checkSpacefulness "a=foo$(lol); echo $a" prop_checkSpacefulness7 = verifyTree checkSpacefulness "a=foo\\ bar; rm $a" prop_checkSpacefulness8 = verifyNotTree checkSpacefulness "a=foo\\ bar; a=foo; rm $a" prop_checkSpacefulness10= verifyTree checkSpacefulness "rm $1" prop_checkSpacefulness11= verifyTree checkSpacefulness "rm ${10//foo/bar}" prop_checkSpacefulness12= verifyNotTree checkSpacefulness "(( $1 + 3 ))" prop_checkSpacefulness13= verifyNotTree checkSpacefulness "if [[ $2 -gt 14 ]]; then true; fi" prop_checkSpacefulness14= verifyNotTree checkSpacefulness "foo=$3 env" prop_checkSpacefulness15= verifyNotTree checkSpacefulness "local foo=$1" prop_checkSpacefulness16= verifyNotTree checkSpacefulness "declare foo=$1" prop_checkSpacefulness17= verifyTree checkSpacefulness "echo foo=$1" prop_checkSpacefulness18= verifyNotTree checkSpacefulness "$1 --flags" prop_checkSpacefulness19= verifyTree checkSpacefulness "echo $PWD" prop_checkSpacefulness20= verifyNotTree checkSpacefulness "n+='foo bar'" prop_checkSpacefulness21= verifyNotTree checkSpacefulness "select foo in $bar; do true; done" prop_checkSpacefulness22= verifyNotTree checkSpacefulness "echo $\"$1\"" prop_checkSpacefulness23= verifyNotTree checkSpacefulness "a=(1); echo ${a[@]}" prop_checkSpacefulness24= verifyTree checkSpacefulness "a='a b'; cat <<< $a" prop_checkSpacefulness25= verifyTree checkSpacefulness "a='s/[0-9]//g'; sed $a" prop_checkSpacefulness26= verifyTree checkSpacefulness "a='foo bar'; echo {1,2,$a}" prop_checkSpacefulness27= verifyNotTree checkSpacefulness "echo ${a:+'foo'}" prop_checkSpacefulness28= verifyNotTree checkSpacefulness "exec {n}>&1; echo $n" prop_checkSpacefulness29= verifyNotTree checkSpacefulness "n=$(stuff); exec {n}>&-;" prop_checkSpacefulness30= verifyTree checkSpacefulness "file='foo bar'; echo foo > $file;" prop_checkSpacefulness31= verifyNotTree checkSpacefulness "echo \"`echo \\\"$1\\\"`\"" prop_checkSpacefulness32= verifyNotTree checkSpacefulness "var=$1; [ -v var ]" prop_checkSpacefulness33= verifyTree checkSpacefulness "for file; do echo $file; done" prop_checkSpacefulness34= verifyTree checkSpacefulness "declare foo$n=$1" prop_checkSpacefulness35= verifyNotTree checkSpacefulness "echo ${1+\"$1\"}" prop_checkSpacefulness36= verifyNotTree checkSpacefulness "arg=$#; echo $arg" prop_checkSpacefulness37= verifyNotTree checkSpacefulness "@test 'status' {\n [ $status -eq 0 ]\n}" prop_checkSpacefulness37v = verifyTree checkVerboseSpacefulness "@test 'status' {\n [ $status -eq 0 ]\n}" -- This is slightly awkward because we want to support structured -- optional checks based on nearly the same logic checkSpacefulness params = checkSpacefulness' onFind params where emit x = tell [x] onFind spaces token _ = when spaces $ if isDefaultAssignment (parentMap params) token then emit $ makeComment InfoC (getId token) 2223 "This default assignment may cause DoS due to globbing. Quote it." else emit $ makeCommentWithFix InfoC (getId token) 2086 "Double quote to prevent globbing and word splitting." (addDoubleQuotesAround params token) isDefaultAssignment parents token = let modifier = getBracedModifier $ bracedString token in any (`isPrefixOf` modifier) ["=", ":="] && isParamTo parents ":" token prop_checkSpacefulness4v= verifyTree checkVerboseSpacefulness "foo=3; foo=$(echo $foo)" prop_checkSpacefulness8v= verifyTree checkVerboseSpacefulness "a=foo\\ bar; a=foo; rm $a" prop_checkSpacefulness28v = verifyTree checkVerboseSpacefulness "exec {n}>&1; echo $n" prop_checkSpacefulness36v = verifyTree checkVerboseSpacefulness "arg=$#; echo $arg" checkVerboseSpacefulness params = checkSpacefulness' onFind params where onFind spaces token name = when (not spaces && name `notElem` specialVariablesWithoutSpaces) $ tell [makeCommentWithFix StyleC (getId token) 2248 "Prefer double quoting even when variables don't contain special characters." (addDoubleQuotesAround params token)] addDoubleQuotesAround params token = (surroundWidth (getId token) params "\"") checkSpacefulness' :: (Bool -> Token -> String -> Writer [TokenComment] ()) -> Parameters -> Token -> [TokenComment] checkSpacefulness' onFind params t = doVariableFlowAnalysis readF writeF (Map.fromList defaults) (variableFlow params) where defaults = zip variablesWithoutSpaces (repeat False) hasSpaces name = gets (Map.findWithDefault True name) setSpaces name bool = modify $ Map.insert name bool readF _ token name = do spaces <- hasSpaces name let needsQuoting = isExpansion token && not (isArrayExpansion token) -- There's another warning for this && not (isCountingReference token) && not (isQuoteFree parents token) && not (isQuotedAlternativeReference token) && not (usedAsCommandName parents token) return . execWriter $ when needsQuoting $ onFind spaces token name where emit x = tell [x] writeF _ _ name (DataString SourceExternal) = setSpaces name True >> return [] writeF _ _ name (DataString SourceInteger) = setSpaces name False >> return [] writeF _ _ name (DataString (SourceFrom vals)) = do map <- get setSpaces name (isSpacefulWord (\x -> Map.findWithDefault True x map) vals) return [] writeF _ _ _ _ = return [] parents = parentMap params isExpansion t = case t of (T_DollarBraced _ _ _ ) -> True _ -> False isSpacefulWord :: (String -> Bool) -> [Token] -> Bool isSpacefulWord f = any (isSpaceful f) isSpaceful :: (String -> Bool) -> Token -> Bool isSpaceful spacefulF x = case x of T_DollarExpansion _ _ -> True T_Backticked _ _ -> True T_Glob _ _ -> True T_Extglob {} -> True T_Literal _ s -> s `containsAny` globspace T_SingleQuoted _ s -> s `containsAny` globspace T_DollarBraced _ _ _ -> spacefulF $ getBracedReference $ bracedString x T_NormalWord _ w -> isSpacefulWord spacefulF w T_DoubleQuoted _ w -> isSpacefulWord spacefulF w _ -> False where globspace = "*?[] \t\n" containsAny s = any (`elem` s) prop_CheckVariableBraces1 = verify checkVariableBraces "a='123'; echo $a" prop_CheckVariableBraces2 = verifyNot checkVariableBraces "a='123'; echo ${a}" prop_CheckVariableBraces3 = verifyNot checkVariableBraces "#shellcheck disable=SC2016\necho '$a'" prop_CheckVariableBraces4 = verifyNot checkVariableBraces "echo $* $1" checkVariableBraces params t = case t of T_DollarBraced id False _ -> unless (name `elem` unbracedVariables) $ styleWithFix id 2250 "Prefer putting braces around variable references even when not strictly required." (fixFor t) _ -> return () where name = getBracedReference $ bracedString t fixFor token = fixWith [replaceStart (getId token) params 1 "${" ,replaceEnd (getId token) params 0 "}"] prop_checkQuotesInLiterals1 = verifyTree checkQuotesInLiterals "param='--foo=\"bar\"'; app $param" prop_checkQuotesInLiterals1a= verifyTree checkQuotesInLiterals "param=\"--foo='lolbar'\"; app $param" prop_checkQuotesInLiterals2 = verifyNotTree checkQuotesInLiterals "param='--foo=\"bar\"'; app \"$param\"" prop_checkQuotesInLiterals3 =verifyNotTree checkQuotesInLiterals "param=('--foo='); app \"${param[@]}\"" prop_checkQuotesInLiterals4 = verifyNotTree checkQuotesInLiterals "param=\"don't bother with this one\"; app $param" prop_checkQuotesInLiterals5 = verifyNotTree checkQuotesInLiterals "param=\"--foo='lolbar'\"; eval app $param" prop_checkQuotesInLiterals6 = verifyTree checkQuotesInLiterals "param='my\\ file'; cmd=\"rm $param\"; $cmd" prop_checkQuotesInLiterals6a= verifyNotTree checkQuotesInLiterals "param='my\\ file'; cmd=\"rm ${#param}\"; $cmd" prop_checkQuotesInLiterals7 = verifyTree checkQuotesInLiterals "param='my\\ file'; rm $param" prop_checkQuotesInLiterals8 = verifyTree checkQuotesInLiterals "param=\"/foo/'bar baz'/etc\"; rm $param" prop_checkQuotesInLiterals9 = verifyNotTree checkQuotesInLiterals "param=\"/foo/'bar baz'/etc\"; rm ${#param}" checkQuotesInLiterals params t = doVariableFlowAnalysis readF writeF Map.empty (variableFlow params) where getQuotes name = fmap (Map.lookup name) get setQuotes name ref = modify $ Map.insert name ref deleteQuotes = modify . Map.delete parents = parentMap params quoteRegex = mkRegex "\"|([/= ]|^)'|'( |$)|\\\\ " containsQuotes s = s `matches` quoteRegex writeF _ _ name (DataString (SourceFrom values)) = do quoteMap <- get let quotedVars = msum $ map (forToken quoteMap) values case quotedVars of Nothing -> deleteQuotes name Just x -> setQuotes name x return [] writeF _ _ _ _ = return [] forToken map (T_DollarBraced id _ t) = -- skip getBracedReference here to avoid false positives on PE Map.lookup (concat . oversimplify $ t) map forToken quoteMap (T_DoubleQuoted id tokens) = msum $ map (forToken quoteMap) tokens forToken quoteMap (T_NormalWord id tokens) = msum $ map (forToken quoteMap) tokens forToken _ t = if containsQuotes (concat $ oversimplify t) then return $ getId t else Nothing squashesQuotes t = case t of T_DollarBraced id _ _ -> "#" `isPrefixOf` bracedString t _ -> False readF _ expr name = do assignment <- getQuotes name return (if isJust assignment && not (isParamTo parents "eval" expr) && not (isQuoteFree parents expr) && not (squashesQuotes expr) then [ makeComment WarningC (fromJust assignment) 2089 $ "Quotes/backslashes will be treated literally. " ++ suggestion, makeComment WarningC (getId expr) 2090 "Quotes/backslashes in this variable will not be respected." ] else []) suggestion = if supportsArrays (shellType params) then "Use an array." else "Rewrite using set/\"$@\" or functions." prop_checkFunctionsUsedExternally1 = verifyTree checkFunctionsUsedExternally "foo() { :; }; sudo foo" prop_checkFunctionsUsedExternally2 = verifyTree checkFunctionsUsedExternally "alias f='a'; xargs -0 f" prop_checkFunctionsUsedExternally2b= verifyNotTree checkFunctionsUsedExternally "alias f='a'; find . -type f" prop_checkFunctionsUsedExternally2c= verifyTree checkFunctionsUsedExternally "alias f='a'; find . -type f -exec f +" prop_checkFunctionsUsedExternally3 = verifyNotTree checkFunctionsUsedExternally "f() { :; }; echo f" prop_checkFunctionsUsedExternally4 = verifyNotTree checkFunctionsUsedExternally "foo() { :; }; sudo \"foo\"" prop_checkFunctionsUsedExternally5 = verifyTree checkFunctionsUsedExternally "foo() { :; }; ssh host foo" prop_checkFunctionsUsedExternally6 = verifyNotTree checkFunctionsUsedExternally "foo() { :; }; ssh host echo foo" prop_checkFunctionsUsedExternally7 = verifyNotTree checkFunctionsUsedExternally "install() { :; }; sudo apt-get install foo" checkFunctionsUsedExternally params t = runNodeAnalysis checkCommand params t where checkCommand _ t@(T_SimpleCommand _ _ (cmd:args)) = case getCommandBasename t of Just name -> do let argStrings = map (\x -> (fromMaybe "" $ getLiteralString x, x)) args let candidates = getPotentialCommands name argStrings mapM_ (checkArg name) candidates _ -> return () checkCommand _ _ = return () -- Try to pick out the argument[s] that may be commands getPotentialCommands name argAndString = case name of "chroot" -> firstNonFlag "screen" -> firstNonFlag "sudo" -> firstNonFlag "xargs" -> firstNonFlag "tmux" -> firstNonFlag "ssh" -> take 1 $ drop 1 $ dropFlags argAndString "find" -> take 1 $ drop 1 $ dropWhile (\x -> fst x `notElem` findExecFlags) argAndString _ -> [] where firstNonFlag = take 1 $ dropFlags argAndString findExecFlags = ["-exec", "-execdir", "-ok"] dropFlags = dropWhile (\x -> "-" `isPrefixOf` fst x) -- Make a map from functions/aliases to definition IDs analyse f t = execState (doAnalysis f t) [] functions = Map.fromList $ analyse findFunctions t findFunctions (T_Function id _ _ name _) = modify ((name, id):) findFunctions t@(T_SimpleCommand id _ (_:args)) | t `isUnqualifiedCommand` "alias" = mapM_ getAlias args findFunctions _ = return () getAlias arg = let string = onlyLiteralString arg in when ('=' `elem` string) $ modify ((takeWhile (/= '=') string, getId arg):) checkArg cmd (_, arg) = potentially $ do literalArg <- getUnquotedLiteral arg -- only consider unquoted literals definitionId <- Map.lookup literalArg functions return $ do warn (getId arg) 2033 "Shell functions can't be passed to external commands." info definitionId 2032 $ "Use own script or sh -c '..' to run this from " ++ cmd ++ "." prop_checkUnused0 = verifyNotTree checkUnusedAssignments "var=foo; echo $var" prop_checkUnused1 = verifyTree checkUnusedAssignments "var=foo; echo $bar" prop_checkUnused2 = verifyNotTree checkUnusedAssignments "var=foo; export var;" prop_checkUnused3 = verifyTree checkUnusedAssignments "for f in *; do echo '$f'; done" prop_checkUnused4 = verifyTree checkUnusedAssignments "local i=0" prop_checkUnused5 = verifyNotTree checkUnusedAssignments "read lol; echo $lol" prop_checkUnused6 = verifyNotTree checkUnusedAssignments "var=4; (( var++ ))" prop_checkUnused7 = verifyNotTree checkUnusedAssignments "var=2; $((var))" prop_checkUnused8 = verifyTree checkUnusedAssignments "var=2; var=3;" prop_checkUnused9 = verifyNotTree checkUnusedAssignments "read ''" prop_checkUnused10= verifyNotTree checkUnusedAssignments "read -p 'test: '" prop_checkUnused11= verifyNotTree checkUnusedAssignments "bar=5; export foo[$bar]=3" prop_checkUnused12= verifyNotTree checkUnusedAssignments "read foo; echo ${!foo}" prop_checkUnused13= verifyNotTree checkUnusedAssignments "x=(1); (( x[0] ))" prop_checkUnused14= verifyNotTree checkUnusedAssignments "x=(1); n=0; echo ${x[n]}" prop_checkUnused15= verifyNotTree checkUnusedAssignments "x=(1); n=0; (( x[n] ))" prop_checkUnused16= verifyNotTree checkUnusedAssignments "foo=5; declare -x foo" prop_checkUnused17= verifyNotTree checkUnusedAssignments "read -i 'foo' -e -p 'Input: ' bar; $bar;" prop_checkUnused18= verifyNotTree checkUnusedAssignments "a=1; arr=( [$a]=42 ); echo \"${arr[@]}\"" prop_checkUnused19= verifyNotTree checkUnusedAssignments "a=1; let b=a+1; echo $b" prop_checkUnused20= verifyNotTree checkUnusedAssignments "a=1; PS1='$a'" prop_checkUnused21= verifyNotTree checkUnusedAssignments "a=1; trap 'echo $a' INT" prop_checkUnused22= verifyNotTree checkUnusedAssignments "a=1; [ -v a ]" prop_checkUnused23= verifyNotTree checkUnusedAssignments "a=1; [ -R a ]" prop_checkUnused24= verifyNotTree checkUnusedAssignments "mapfile -C a b; echo ${b[@]}" prop_checkUnused25= verifyNotTree checkUnusedAssignments "readarray foo; echo ${foo[@]}" prop_checkUnused26= verifyNotTree checkUnusedAssignments "declare -F foo" prop_checkUnused27= verifyTree checkUnusedAssignments "var=3; [ var -eq 3 ]" prop_checkUnused28= verifyNotTree checkUnusedAssignments "var=3; [[ var -eq 3 ]]" prop_checkUnused29= verifyNotTree checkUnusedAssignments "var=(a b); declare -p var" prop_checkUnused30= verifyTree checkUnusedAssignments "let a=1" prop_checkUnused31= verifyTree checkUnusedAssignments "let 'a=1'" prop_checkUnused32= verifyTree checkUnusedAssignments "let a=b=c; echo $a" prop_checkUnused33= verifyNotTree checkUnusedAssignments "a=foo; [[ foo =~ ^{$a}$ ]]" prop_checkUnused34= verifyNotTree checkUnusedAssignments "foo=1; (( t = foo )); echo $t" prop_checkUnused35= verifyNotTree checkUnusedAssignments "a=foo; b=2; echo ${a:b}" prop_checkUnused36= verifyNotTree checkUnusedAssignments "if [[ -v foo ]]; then true; fi" prop_checkUnused37= verifyNotTree checkUnusedAssignments "fd=2; exec {fd}>&-" prop_checkUnused38= verifyTree checkUnusedAssignments "(( a=42 ))" prop_checkUnused39= verifyNotTree checkUnusedAssignments "declare -x -f foo" prop_checkUnused40= verifyNotTree checkUnusedAssignments "arr=(1 2); num=2; echo \"${arr[@]:num}\"" prop_checkUnused41= verifyNotTree checkUnusedAssignments "@test 'foo' {\ntrue\n}\n" prop_checkUnused42= verifyNotTree checkUnusedAssignments "DEFINE_string foo '' ''; echo \"${FLAGS_foo}\"" prop_checkUnused43= verifyTree checkUnusedAssignments "DEFINE_string foo '' ''" prop_checkUnused44= verifyNotTree checkUnusedAssignments "DEFINE_string \"foo$ibar\" x y" prop_checkUnused45= verifyTree checkUnusedAssignments "readonly foo=bar" prop_checkUnused46= verifyTree checkUnusedAssignments "readonly foo=(bar)" checkUnusedAssignments params t = execWriter (mapM_ warnFor unused) where flow = variableFlow params references = foldl (flip ($)) defaultMap (map insertRef flow) insertRef (Reference (base, token, name)) = Map.insert (stripSuffix name) () insertRef _ = id assignments = foldl (flip ($)) Map.empty (map insertAssignment flow) insertAssignment (Assignment (_, token, name, _)) | isVariableName name = Map.insert name token insertAssignment _ = id unused = Map.assocs $ Map.difference assignments references warnFor (name, token) = warn (getId token) 2034 $ name ++ " appears unused. Verify use (or export if used externally)." stripSuffix = takeWhile isVariableChar defaultMap = Map.fromList $ zip internalVariables $ repeat () prop_checkUnassignedReferences1 = verifyTree checkUnassignedReferences "echo $foo" prop_checkUnassignedReferences2 = verifyNotTree checkUnassignedReferences "foo=hello; echo $foo" prop_checkUnassignedReferences3 = verifyTree checkUnassignedReferences "MY_VALUE=3; echo $MYVALUE" prop_checkUnassignedReferences4 = verifyNotTree checkUnassignedReferences "RANDOM2=foo; echo $RANDOM" prop_checkUnassignedReferences5 = verifyNotTree checkUnassignedReferences "declare -A foo=([bar]=baz); echo ${foo[bar]}" prop_checkUnassignedReferences6 = verifyNotTree checkUnassignedReferences "foo=..; echo ${foo-bar}" prop_checkUnassignedReferences7 = verifyNotTree checkUnassignedReferences "getopts ':h' foo; echo $foo" prop_checkUnassignedReferences8 = verifyNotTree checkUnassignedReferences "let 'foo = 1'; echo $foo" prop_checkUnassignedReferences9 = verifyNotTree checkUnassignedReferences "echo ${foo-bar}" prop_checkUnassignedReferences10= verifyNotTree checkUnassignedReferences "echo ${foo:?}" prop_checkUnassignedReferences11= verifyNotTree checkUnassignedReferences "declare -A foo; echo \"${foo[@]}\"" prop_checkUnassignedReferences12= verifyNotTree checkUnassignedReferences "typeset -a foo; echo \"${foo[@]}\"" prop_checkUnassignedReferences13= verifyNotTree checkUnassignedReferences "f() { local foo; echo $foo; }" prop_checkUnassignedReferences14= verifyNotTree checkUnassignedReferences "foo=; echo $foo" prop_checkUnassignedReferences15= verifyNotTree checkUnassignedReferences "f() { true; }; export -f f" prop_checkUnassignedReferences16= verifyNotTree checkUnassignedReferences "declare -A foo=( [a b]=bar ); echo ${foo[a b]}" prop_checkUnassignedReferences17= verifyNotTree checkUnassignedReferences "USERS=foo; echo $USER" prop_checkUnassignedReferences18= verifyNotTree checkUnassignedReferences "FOOBAR=42; export FOOBAR=" prop_checkUnassignedReferences19= verifyNotTree checkUnassignedReferences "readonly foo=bar; echo $foo" prop_checkUnassignedReferences20= verifyNotTree checkUnassignedReferences "printf -v foo bar; echo $foo" prop_checkUnassignedReferences21= verifyTree checkUnassignedReferences "echo ${#foo}" prop_checkUnassignedReferences22= verifyNotTree checkUnassignedReferences "echo ${!os*}" prop_checkUnassignedReferences23= verifyTree checkUnassignedReferences "declare -a foo; foo[bar]=42;" prop_checkUnassignedReferences24= verifyNotTree checkUnassignedReferences "declare -A foo; foo[bar]=42;" prop_checkUnassignedReferences25= verifyNotTree checkUnassignedReferences "declare -A foo=(); foo[bar]=42;" prop_checkUnassignedReferences26= verifyNotTree checkUnassignedReferences "a::b() { foo; }; readonly -f a::b" prop_checkUnassignedReferences27= verifyNotTree checkUnassignedReferences ": ${foo:=bar}" prop_checkUnassignedReferences28= verifyNotTree checkUnassignedReferences "#!/bin/ksh\necho \"${.sh.version}\"\n" prop_checkUnassignedReferences29= verifyNotTree checkUnassignedReferences "if [[ -v foo ]]; then echo $foo; fi" prop_checkUnassignedReferences30= verifyNotTree checkUnassignedReferences "if [[ -v foo[3] ]]; then echo ${foo[3]}; fi" prop_checkUnassignedReferences31= verifyNotTree checkUnassignedReferences "X=1; if [[ -v foo[$X+42] ]]; then echo ${foo[$X+42]}; fi" prop_checkUnassignedReferences32= verifyNotTree checkUnassignedReferences "if [[ -v \"foo[1]\" ]]; then echo ${foo[@]}; fi" prop_checkUnassignedReferences33= verifyNotTree checkUnassignedReferences "f() { local -A foo; echo \"${foo[@]}\"; }" prop_checkUnassignedReferences34= verifyNotTree checkUnassignedReferences "declare -A foo; (( foo[bar] ))" prop_checkUnassignedReferences35= verifyNotTree checkUnassignedReferences "echo ${arr[foo-bar]:?fail}" prop_checkUnassignedReferences36= verifyNotTree checkUnassignedReferences "read -a foo -r <<<\"foo bar\"; echo \"$foo\"" prop_checkUnassignedReferences37= verifyNotTree checkUnassignedReferences "var=howdy; printf -v 'array[0]' %s \"$var\"; printf %s \"${array[0]}\";" prop_checkUnassignedReferences38= verifyTree (checkUnassignedReferences' True) "echo $VAR" checkUnassignedReferences = checkUnassignedReferences' False checkUnassignedReferences' includeGlobals params t = warnings where (readMap, writeMap) = execState (mapM tally $ variableFlow params) (Map.empty, Map.empty) defaultAssigned = Map.fromList $ map (\a -> (a, ())) $ filter (not . null) internalVariables tally (Assignment (_, _, name, _)) = modify (\(read, written) -> (read, Map.insert name () written)) tally (Reference (_, place, name)) = modify (\(read, written) -> (Map.insertWith (const id) name place read, written)) tally _ = return () unassigned = Map.toList $ Map.difference (Map.difference readMap writeMap) defaultAssigned writtenVars = filter isVariableName $ Map.keys writeMap getBestMatch var = do (match, score) <- listToMaybe best guard $ goodMatch var match score return match where matches = map (\x -> (x, match var x)) writtenVars best = sortBy (comparing snd) matches goodMatch var match score = let l = length match in l > 3 && score <= 1 || l > 7 && score <= 2 isLocal = any isLower warningForGlobals var place = do match <- getBestMatch var return $ warn (getId place) 2153 $ "Possible misspelling: " ++ var ++ " may not be assigned, but " ++ match ++ " is." warningForLocals var place = return $ warn (getId place) 2154 $ var ++ " is referenced but not assigned" ++ optionalTip ++ "." where optionalTip = if var `elem` commonCommands then " (for output from commands, use \"$(" ++ var ++ " ..." ++ ")\" )" else fromMaybe "" $ do match <- getBestMatch var return $ " (did you mean '" ++ match ++ "'?)" warningFor var place = do guard $ isVariableName var guard . not $ isInArray var place || isGuarded place (if includeGlobals || isLocal var then warningForLocals else warningForGlobals) var place warnings = execWriter . sequence $ mapMaybe (uncurry warningFor) unassigned -- Due to parsing, foo=( [bar]=baz ) parses 'bar' as a reference even for assoc arrays. -- Similarly, ${foo[bar baz]} may not be referencing bar/baz. Just skip these. isInArray var t = any isArray $ getPath (parentMap params) t where isArray T_Array {} = True isArray b@(T_DollarBraced _ _ _) | var /= getBracedReference (bracedString b) = True isArray _ = False isGuarded (T_DollarBraced _ _ v) = rest `matches` guardRegex where name = concat $ oversimplify v rest = dropWhile isVariableChar $ dropWhile (`elem` "#!") name isGuarded _ = False -- :? or :- with optional array index and colon guardRegex = mkRegex "^(\\[.*\\])?:?[-?]" match var candidate = if var /= candidate && map toLower var == map toLower candidate then 1 else dist var candidate prop_checkGlobsAsOptions1 = verify checkGlobsAsOptions "rm *.txt" prop_checkGlobsAsOptions2 = verify checkGlobsAsOptions "ls ??.*" prop_checkGlobsAsOptions3 = verifyNot checkGlobsAsOptions "rm -- *.txt" prop_checkGlobsAsOptions4 = verifyNot checkGlobsAsOptions "*.txt" checkGlobsAsOptions _ (T_SimpleCommand _ _ args) = mapM_ check $ takeWhile (not . isEndOfArgs) (drop 1 args) where check v@(T_NormalWord _ (T_Glob id s:_)) | s == "*" || s == "?" = info id 2035 "Use ./*glob* or -- *glob* so names with dashes won't become options." check _ = return () isEndOfArgs t = case concat $ oversimplify t of "--" -> True ":::" -> True "::::" -> True _ -> False checkGlobsAsOptions _ _ = return () prop_checkWhileReadPitfalls1 = verify checkWhileReadPitfalls "while read foo; do ssh $foo uptime; done < file" prop_checkWhileReadPitfalls2 = verifyNot checkWhileReadPitfalls "while read -u 3 foo; do ssh $foo uptime; done 3< file" prop_checkWhileReadPitfalls3 = verifyNot checkWhileReadPitfalls "while true; do ssh host uptime; done" prop_checkWhileReadPitfalls4 = verifyNot checkWhileReadPitfalls "while read foo; do ssh $foo hostname < /dev/null; done" prop_checkWhileReadPitfalls5 = verifyNot checkWhileReadPitfalls "while read foo; do echo ls | ssh $foo; done" prop_checkWhileReadPitfalls6 = verifyNot checkWhileReadPitfalls "while read foo <&3; do ssh $foo; done 3< foo" prop_checkWhileReadPitfalls7 = verify checkWhileReadPitfalls "while read foo; do if true; then ssh $foo uptime; fi; done < file" prop_checkWhileReadPitfalls8 = verifyNot checkWhileReadPitfalls "while read foo; do ssh -n $foo uptime; done < file" checkWhileReadPitfalls _ (T_WhileExpression id [command] contents) | isStdinReadCommand command = mapM_ checkMuncher contents where munchers = [ "ssh", "ffmpeg", "mplayer", "HandBrakeCLI" ] preventionFlags = ["n", "noconsolecontrols" ] isStdinReadCommand (T_Pipeline _ _ [T_Redirecting id redirs cmd]) = let plaintext = oversimplify cmd in head (plaintext ++ [""]) == "read" && ("-u" `notElem` plaintext) && all (not . stdinRedirect) redirs isStdinReadCommand _ = False checkMuncher (T_Pipeline _ _ (T_Redirecting _ redirs cmd:_)) | not $ any stdinRedirect redirs = case cmd of (T_IfExpression _ thens elses) -> mapM_ checkMuncher . concat $ map fst thens ++ map snd thens ++ [elses] _ -> potentially $ do name <- getCommandBasename cmd guard $ name `elem` munchers -- Sloppily check if the command has a flag to prevent eating stdin. let flags = getAllFlags cmd guard . not $ any (`elem` preventionFlags) $ map snd flags return $ do info id 2095 $ name ++ " may swallow stdin, preventing this loop from working properly." warn (getId cmd) 2095 $ "Add < /dev/null to prevent " ++ name ++ " from swallowing stdin." checkMuncher _ = return () stdinRedirect (T_FdRedirect _ fd _) | fd == "" || fd == "0" = True stdinRedirect _ = False checkWhileReadPitfalls _ _ = return () prop_checkPrefixAssign1 = verify checkPrefixAssignmentReference "var=foo echo $var" prop_checkPrefixAssign2 = verifyNot checkPrefixAssignmentReference "var=$(echo $var) cmd" checkPrefixAssignmentReference params t@(T_DollarBraced id _ value) = check path where name = getBracedReference $ bracedString t path = getPath (parentMap params) t idPath = map getId path check [] = return () check (t:rest) = case t of T_SimpleCommand _ vars (_:_) -> mapM_ checkVar vars _ -> check rest checkVar (T_Assignment aId mode aName [] value) | aName == name && (aId `notElem` idPath) = do warn aId 2097 "This assignment is only seen by the forked process." warn id 2098 "This expansion will not see the mentioned assignment." checkVar _ = return () checkPrefixAssignmentReference _ _ = return () prop_checkCharRangeGlob1 = verify checkCharRangeGlob "ls *[:digit:].jpg" prop_checkCharRangeGlob2 = verifyNot checkCharRangeGlob "ls *[[:digit:]].jpg" prop_checkCharRangeGlob3 = verify checkCharRangeGlob "ls [10-15]" prop_checkCharRangeGlob4 = verifyNot checkCharRangeGlob "ls [a-zA-Z]" prop_checkCharRangeGlob5 = verifyNot checkCharRangeGlob "tr -d [a-zA-Z]" -- tr has 2060 checkCharRangeGlob p t@(T_Glob id str) | isCharClass str && not (isParamTo (parentMap p) "tr" t) = if ":" `isPrefixOf` contents && ":" `isSuffixOf` contents && contents /= ":" then warn id 2101 "Named class needs outer [], e.g. [[:digit:]]." else when ('[' `notElem` contents && hasDupes) $ info id 2102 "Ranges can only match single chars (mentioned due to duplicates)." where isCharClass str = "[" `isPrefixOf` str && "]" `isSuffixOf` str contents = drop 1 . take (length str - 1) $ str hasDupes = any (>1) . map length . group . sort . filter (/= '-') $ contents checkCharRangeGlob _ _ = return () prop_checkCdAndBack1 = verify checkCdAndBack "for f in *; do cd $f; git pull; cd ..; done" prop_checkCdAndBack2 = verifyNot checkCdAndBack "for f in *; do cd $f || continue; git pull; cd ..; done" prop_checkCdAndBack3 = verifyNot checkCdAndBack "while [[ $PWD != / ]]; do cd ..; done" prop_checkCdAndBack4 = verify checkCdAndBack "cd $tmp; foo; cd -" prop_checkCdAndBack5 = verifyNot checkCdAndBack "cd ..; foo; cd .." prop_checkCdAndBack6 = verify checkCdAndBack "for dir in */; do cd \"$dir\"; some_cmd; cd ..; done" prop_checkCdAndBack7 = verifyNot checkCdAndBack "set -e; for dir in */; do cd \"$dir\"; some_cmd; cd ..; done" prop_checkCdAndBack8 = verifyNot checkCdAndBack "cd tmp\nfoo\n# shellcheck disable=SC2103\ncd ..\n" checkCdAndBack params t = unless (hasSetE params) $ mapM_ doList $ getCommandSequences t where isCdRevert t = case oversimplify t of [_, p] -> p `elem` ["..", "-"] _ -> False getCandidate (T_Annotation _ _ x) = getCandidate x getCandidate (T_Pipeline id _ [x]) | x `isCommand` "cd" = return x getCandidate _ = Nothing findCdPair list = case list of (a:b:rest) -> if isCdRevert b && not (isCdRevert a) then return $ getId b else findCdPair (b:rest) _ -> Nothing doList list = potentially $ do cd <- findCdPair $ mapMaybe getCandidate list return $ info cd 2103 "Use a ( subshell ) to avoid having to cd back." prop_checkLoopKeywordScope1 = verify checkLoopKeywordScope "continue 2" prop_checkLoopKeywordScope2 = verify checkLoopKeywordScope "for f; do ( break; ); done" prop_checkLoopKeywordScope3 = verify checkLoopKeywordScope "if true; then continue; fi" prop_checkLoopKeywordScope4 = verifyNot checkLoopKeywordScope "while true; do break; done" prop_checkLoopKeywordScope5 = verify checkLoopKeywordScope "if true; then break; fi" prop_checkLoopKeywordScope6 = verify checkLoopKeywordScope "while true; do true | { break; }; done" prop_checkLoopKeywordScope7 = verifyNot checkLoopKeywordScope "#!/bin/ksh\nwhile true; do true | { break; }; done" checkLoopKeywordScope params t | name `elem` map Just ["continue", "break"] = if not $ any isLoop path then if any isFunction $ take 1 path -- breaking at a source/function invocation is an abomination. Let's ignore it. then err (getId t) 2104 $ "In functions, use return instead of " ++ fromJust name ++ "." else err (getId t) 2105 $ fromJust name ++ " is only valid in loops." else case map subshellType $ filter (not . isFunction) path of Just str:_ -> warn (getId t) 2106 $ "This only exits the subshell caused by the " ++ str ++ "." _ -> return () where name = getCommandName t path = let p = getPath (parentMap params) t in filter relevant p subshellType t = case leadType params t of NoneScope -> Nothing SubshellScope str -> return str relevant t = isLoop t || isFunction t || isJust (subshellType t) checkLoopKeywordScope _ _ = return () prop_checkFunctionDeclarations1 = verify checkFunctionDeclarations "#!/bin/ksh\nfunction foo() { command foo --lol \"$@\"; }" prop_checkFunctionDeclarations2 = verify checkFunctionDeclarations "#!/bin/dash\nfunction foo { lol; }" prop_checkFunctionDeclarations3 = verifyNot checkFunctionDeclarations "foo() { echo bar; }" checkFunctionDeclarations params (T_Function id (FunctionKeyword hasKeyword) (FunctionParentheses hasParens) _ _) = case shellType params of Bash -> return () Ksh -> when (hasKeyword && hasParens) $ err id 2111 "ksh does not allow 'function' keyword and '()' at the same time." Dash -> forSh Sh -> forSh where forSh = do when (hasKeyword && hasParens) $ warn id 2112 "'function' keyword is non-standard. Delete it." when (hasKeyword && not hasParens) $ warn id 2113 "'function' keyword is non-standard. Use 'foo()' instead of 'function foo'." checkFunctionDeclarations _ _ = return () prop_checkStderrPipe1 = verify checkStderrPipe "#!/bin/ksh\nfoo |& bar" prop_checkStderrPipe2 = verifyNot checkStderrPipe "#!/bin/bash\nfoo |& bar" checkStderrPipe params = case shellType params of Ksh -> match _ -> const $ return () where match (T_Pipe id "|&") = err id 2118 "Ksh does not support |&. Use 2>&1 |." match _ = return () prop_checkUnpassedInFunctions1 = verifyTree checkUnpassedInFunctions "foo() { echo $1; }; foo" prop_checkUnpassedInFunctions2 = verifyNotTree checkUnpassedInFunctions "foo() { echo $1; };" prop_checkUnpassedInFunctions3 = verifyNotTree checkUnpassedInFunctions "foo() { echo $lol; }; foo" prop_checkUnpassedInFunctions4 = verifyNotTree checkUnpassedInFunctions "foo() { echo $0; }; foo" prop_checkUnpassedInFunctions5 = verifyNotTree checkUnpassedInFunctions "foo() { echo $1; }; foo 'lol'; foo" prop_checkUnpassedInFunctions6 = verifyNotTree checkUnpassedInFunctions "foo() { set -- *; echo $1; }; foo" prop_checkUnpassedInFunctions7 = verifyTree checkUnpassedInFunctions "foo() { echo $1; }; foo; foo;" prop_checkUnpassedInFunctions8 = verifyNotTree checkUnpassedInFunctions "foo() { echo $((1)); }; foo;" prop_checkUnpassedInFunctions9 = verifyNotTree checkUnpassedInFunctions "foo() { echo $(($b)); }; foo;" prop_checkUnpassedInFunctions10= verifyNotTree checkUnpassedInFunctions "foo() { echo $!; }; foo;" prop_checkUnpassedInFunctions11= verifyNotTree checkUnpassedInFunctions "foo() { bar() { echo $1; }; bar baz; }; foo;" prop_checkUnpassedInFunctions12= verifyNotTree checkUnpassedInFunctions "foo() { echo ${!var*}; }; foo;" prop_checkUnpassedInFunctions13= verifyNotTree checkUnpassedInFunctions "# shellcheck disable=SC2120\nfoo() { echo $1; }\nfoo\n" checkUnpassedInFunctions params root = execWriter $ mapM_ warnForGroup referenceGroups where functionMap :: Map.Map String Token functionMap = Map.fromList $ map (\t@(T_Function _ _ _ name _) -> (name,t)) functions functions = execWriter $ doAnalysis (tell . maybeToList . findFunction) root findFunction t@(T_Function id _ _ name body) = let flow = getVariableFlow params body in if any (isPositionalReference t) flow && not (any isPositionalAssignment flow) then return t else Nothing findFunction _ = Nothing isPositionalAssignment x = case x of Assignment (_, _, str, _) -> isPositional str _ -> False isPositionalReference function x = case x of Reference (_, t, str) -> isPositional str && t `isDirectChildOf` function _ -> False isDirectChildOf child parent = fromMaybe False $ do function <- find (\x -> case x of T_Function {} -> True T_Script {} -> True -- for sourced files _ -> False) $ getPath (parentMap params) child return $ getId parent == getId function referenceList :: [(String, Bool, Token)] referenceList = execWriter $ doAnalysis (fromMaybe (return ()) . checkCommand) root checkCommand :: Token -> Maybe (Writer [(String, Bool, Token)] ()) checkCommand t@(T_SimpleCommand _ _ (cmd:args)) = do str <- getLiteralString cmd guard $ Map.member str functionMap return $ tell [(str, null args, t)] checkCommand _ = Nothing isPositional str = str == "*" || str == "@" || (all isDigit str && str /= "0" && str /= "") isArgumentless (_, b, _) = b referenceGroups = Map.elems $ foldr updateWith Map.empty referenceList updateWith x@(name, _, _) = Map.insertWith (++) name [x] warnForGroup group = when (all isArgumentless group) $ -- Allow ignoring SC2120 on the function to ignore all calls let (name, func) = getFunction group ignoring = shouldIgnoreCode params 2120 func in unless ignoring $ do mapM_ suggestParams group warnForDeclaration func name suggestParams (name, _, thing) = info (getId thing) 2119 $ "Use " ++ name ++ " \"$@\" if function's $1 should mean script's $1." warnForDeclaration func name = warn (getId func) 2120 $ name ++ " references arguments, but none are ever passed." getFunction ((name, _, _):_) = (name, fromJust $ Map.lookup name functionMap) prop_checkOverridingPath1 = verify checkOverridingPath "PATH=\"$var/$foo\"" prop_checkOverridingPath2 = verify checkOverridingPath "PATH=\"mydir\"" prop_checkOverridingPath3 = verify checkOverridingPath "PATH=/cow/foo" prop_checkOverridingPath4 = verifyNot checkOverridingPath "PATH=/cow/foo/bin" prop_checkOverridingPath5 = verifyNot checkOverridingPath "PATH='/bin:/sbin'" prop_checkOverridingPath6 = verifyNot checkOverridingPath "PATH=\"$var/$foo\" cmd" prop_checkOverridingPath7 = verifyNot checkOverridingPath "PATH=$OLDPATH" prop_checkOverridingPath8 = verifyNot checkOverridingPath "PATH=$PATH:/stuff" checkOverridingPath _ (T_SimpleCommand _ vars []) = mapM_ checkVar vars where checkVar (T_Assignment id Assign "PATH" [] word) = let string = concat $ oversimplify word in unless (any (`isInfixOf` string) ["/bin", "/sbin" ]) $ do when ('/' `elem` string && ':' `notElem` string) $ notify id when (isLiteral word && ':' `notElem` string && '/' `notElem` string) $ notify id checkVar _ = return () notify id = warn id 2123 "PATH is the shell search path. Use another name." checkOverridingPath _ _ = return () prop_checkTildeInPath1 = verify checkTildeInPath "PATH=\"$PATH:~/bin\"" prop_checkTildeInPath2 = verify checkTildeInPath "PATH='~foo/bin'" prop_checkTildeInPath3 = verifyNot checkTildeInPath "PATH=~/bin" checkTildeInPath _ (T_SimpleCommand _ vars _) = mapM_ checkVar vars where checkVar (T_Assignment id Assign "PATH" [] (T_NormalWord _ parts)) = when (any (\x -> isQuoted x && hasTilde x) parts) $ warn id 2147 "Literal tilde in PATH works poorly across programs." checkVar _ = return () hasTilde t = fromMaybe False (liftM2 elem (return '~') (getLiteralStringExt (const $ return "") t)) isQuoted T_DoubleQuoted {} = True isQuoted T_SingleQuoted {} = True isQuoted _ = False checkTildeInPath _ _ = return () prop_checkUnsupported3 = verify checkUnsupported "#!/bin/sh\ncase foo in bar) baz ;& esac" prop_checkUnsupported4 = verify checkUnsupported "#!/bin/ksh\ncase foo in bar) baz ;;& esac" prop_checkUnsupported5 = verify checkUnsupported "#!/bin/bash\necho \"${ ls; }\"" checkUnsupported params t = when (not (null support) && (shellType params `notElem` support)) $ report name where (name, support) = shellSupport t report s = err (getId t) 2127 $ "To use " ++ s ++ ", specify #!/usr/bin/env " ++ (map toLower . intercalate " or " . map show $ support) -- TODO: Move more of these checks here shellSupport t = case t of T_CaseExpression _ _ list -> forCase (map (\(a,_,_) -> a) list) T_DollarBraceCommandExpansion {} -> ("${ ..; } command expansion", [Ksh]) _ -> ("", []) where forCase seps | CaseContinue `elem` seps = ("cases with ;;&", [Bash]) forCase seps | CaseFallThrough `elem` seps = ("cases with ;&", [Bash, Ksh]) forCase _ = ("", []) groupWith f = groupBy ((==) `on` f) prop_checkMultipleAppends1 = verify checkMultipleAppends "foo >> file; bar >> file; baz >> file;" prop_checkMultipleAppends2 = verify checkMultipleAppends "foo >> file; bar | grep f >> file; baz >> file;" prop_checkMultipleAppends3 = verifyNot checkMultipleAppends "foo < file; bar < file; baz < file;" checkMultipleAppends params t = mapM_ checkList $ getCommandSequences t where checkList list = mapM_ checkGroup (groupWith (fmap fst) $ map getTarget list) checkGroup (f:_:_:_) | isJust f = style (snd $ fromJust f) 2129 "Consider using { cmd1; cmd2; } >> file instead of individual redirects." checkGroup _ = return () getTarget (T_Annotation _ _ t) = getTarget t getTarget (T_Pipeline _ _ args@(_:_)) = getTarget (last args) getTarget (T_Redirecting id list _) = do file <- mapMaybe getAppend list !!! 0 return (file, id) getTarget _ = Nothing getAppend (T_FdRedirect _ _ (T_IoFile _ T_DGREAT {} f)) = return f getAppend _ = Nothing prop_checkSuspiciousIFS1 = verify checkSuspiciousIFS "IFS=\"\\n\"" prop_checkSuspiciousIFS2 = verifyNot checkSuspiciousIFS "IFS=$'\\t'" checkSuspiciousIFS params (T_Assignment id Assign "IFS" [] value) = potentially $ do str <- getLiteralString value return $ check str where n = if shellType params == Sh then "''" else "$'\\n'" t = if shellType params == Sh then "\"$(printf '\\t')\"" else "$'\\t'" check value = case value of "\\n" -> suggest n "/n" -> suggest n "\\t" -> suggest t "/t" -> suggest t _ -> return () suggest r = warn id 2141 $ "Did you mean IFS=" ++ r ++ " ?" checkSuspiciousIFS _ _ = return () prop_checkGrepQ1= verify checkShouldUseGrepQ "[[ $(foo | grep bar) ]]" prop_checkGrepQ2= verify checkShouldUseGrepQ "[ -z $(fgrep lol) ]" prop_checkGrepQ3= verify checkShouldUseGrepQ "[ -n \"$(foo | zgrep lol)\" ]" prop_checkGrepQ4= verifyNot checkShouldUseGrepQ "[ -z $(grep bar | cmd) ]" prop_checkGrepQ5= verifyNot checkShouldUseGrepQ "rm $(ls | grep file)" prop_checkGrepQ6= verifyNot checkShouldUseGrepQ "[[ -n $(pgrep foo) ]]" checkShouldUseGrepQ params t = potentially $ case t of TC_Nullary id _ token -> check id True token TC_Unary id _ "-n" token -> check id True token TC_Unary id _ "-z" token -> check id False token _ -> fail "not check" where check id bool token = do name <- getFinalGrep token let op = if bool then "-n" else "-z" let flip = if bool then "" else "! " return . style id 2143 $ "Use " ++ flip ++ name ++ " -q instead of " ++ "comparing output with [ " ++ op ++ " .. ]." getFinalGrep t = do cmds <- getPipeline t guard . not . null $ cmds name <- getCommandBasename $ last cmds guard . isGrep $ name return name getPipeline t = case t of T_NormalWord _ [x] -> getPipeline x T_DoubleQuoted _ [x] -> getPipeline x T_DollarExpansion _ [x] -> getPipeline x T_Pipeline _ _ cmds -> return cmds _ -> fail "unknown" isGrep = (`elem` ["grep", "egrep", "fgrep", "zgrep"]) prop_checkTestArgumentSplitting1 = verify checkTestArgumentSplitting "[ -e *.mp3 ]" prop_checkTestArgumentSplitting2 = verifyNot checkTestArgumentSplitting "[[ $a == *b* ]]" prop_checkTestArgumentSplitting3 = verify checkTestArgumentSplitting "[[ *.png == '' ]]" prop_checkTestArgumentSplitting4 = verify checkTestArgumentSplitting "[[ foo == f{o,oo,ooo} ]]" prop_checkTestArgumentSplitting5 = verify checkTestArgumentSplitting "[[ $@ ]]" prop_checkTestArgumentSplitting6 = verify checkTestArgumentSplitting "[ -e $@ ]" prop_checkTestArgumentSplitting7 = verify checkTestArgumentSplitting "[ $@ == $@ ]" prop_checkTestArgumentSplitting8 = verify checkTestArgumentSplitting "[[ $@ = $@ ]]" prop_checkTestArgumentSplitting9 = verifyNot checkTestArgumentSplitting "[[ foo =~ bar{1,2} ]]" prop_checkTestArgumentSplitting10 = verifyNot checkTestArgumentSplitting "[ \"$@\" ]" prop_checkTestArgumentSplitting11 = verify checkTestArgumentSplitting "[[ \"$@\" ]]" prop_checkTestArgumentSplitting12 = verify checkTestArgumentSplitting "[ *.png ]" prop_checkTestArgumentSplitting13 = verify checkTestArgumentSplitting "[ \"$@\" == \"\" ]" prop_checkTestArgumentSplitting14 = verify checkTestArgumentSplitting "[[ \"$@\" == \"\" ]]" prop_checkTestArgumentSplitting15 = verifyNot checkTestArgumentSplitting "[[ \"$*\" == \"\" ]]" prop_checkTestArgumentSplitting16 = verifyNot checkTestArgumentSplitting "[[ -v foo[123] ]]" prop_checkTestArgumentSplitting17 = verifyNot checkTestArgumentSplitting "#!/bin/ksh\n[ -e foo* ]" prop_checkTestArgumentSplitting18 = verify checkTestArgumentSplitting "#!/bin/ksh\n[ -d foo* ]" checkTestArgumentSplitting :: Parameters -> Token -> Writer [TokenComment] () checkTestArgumentSplitting params t = case t of (TC_Unary _ typ op token) | isGlob token -> if op == "-v" then when (typ == SingleBracket) $ err (getId token) 2208 $ "Use [[ ]] or quote arguments to -v to avoid glob expansion." else if (typ == SingleBracket && shellType params == Ksh) then -- Ksh appears to stop processing after unrecognized tokens, so operators -- will effectively work with globs, but only the first match. when (op `elem` ['-':c:[] | c <- "bcdfgkprsuwxLhNOGRS" ]) $ warn (getId token) 2245 $ op ++ " only applies to the first expansion of this glob. Use a loop to check any/all." else err (getId token) 2144 $ op ++ " doesn't work with globs. Use a for loop." (TC_Nullary _ typ token) -> do checkBraces typ token checkGlobs typ token when (typ == DoubleBracket) $ checkArrays typ token (TC_Unary _ typ op token) -> checkAll typ token (TC_Binary _ typ op lhs rhs) -> if op `elem` ["=", "==", "!=", "=~"] then do checkAll typ lhs checkArrays typ rhs checkBraces typ rhs else mapM_ (checkAll typ) [lhs, rhs] _ -> return () where checkAll typ token = do checkArrays typ token checkBraces typ token checkGlobs typ token checkArrays typ token = when (any isArrayExpansion $ getWordParts token) $ if typ == SingleBracket then warn (getId token) 2198 "Arrays don't work as operands in [ ]. Use a loop (or concatenate with * instead of @)." else err (getId token) 2199 "Arrays implicitly concatenate in [[ ]]. Use a loop (or explicit * instead of @)." checkBraces typ token = when (any isBraceExpansion $ getWordParts token) $ if typ == SingleBracket then warn (getId token) 2200 "Brace expansions don't work as operands in [ ]. Use a loop." else err (getId token) 2201 "Brace expansion doesn't happen in [[ ]]. Use a loop." checkGlobs typ token = when (isGlob token) $ if typ == SingleBracket then warn (getId token) 2202 "Globs don't work as operands in [ ]. Use a loop." else err (getId token) 2203 "Globs are ignored in [[ ]] except right of =/!=. Use a loop." prop_checkMaskedReturns1 = verify checkMaskedReturns "f() { local a=$(false); }" prop_checkMaskedReturns2 = verify checkMaskedReturns "declare a=$(false)" prop_checkMaskedReturns3 = verify checkMaskedReturns "declare a=\"`false`\"" prop_checkMaskedReturns4 = verifyNot checkMaskedReturns "declare a; a=$(false)" prop_checkMaskedReturns5 = verifyNot checkMaskedReturns "f() { local -r a=$(false); }" checkMaskedReturns _ t@(T_SimpleCommand id _ (cmd:rest)) = potentially $ do name <- getCommandName t guard $ name `elem` ["declare", "export"] || name == "local" && "r" `notElem` map snd (getAllFlags t) return $ mapM_ checkArgs rest where checkArgs (T_Assignment id _ _ _ word) | any hasReturn $ getWordParts word = warn id 2155 "Declare and assign separately to avoid masking return values." checkArgs _ = return () hasReturn t = case t of T_Backticked {} -> True T_DollarExpansion {} -> True _ -> False checkMaskedReturns _ _ = return () prop_checkReadWithoutR1 = verify checkReadWithoutR "read -a foo" prop_checkReadWithoutR2 = verifyNot checkReadWithoutR "read -ar foo" checkReadWithoutR _ t@T_SimpleCommand {} | t `isUnqualifiedCommand` "read" = unless ("r" `elem` map snd (getAllFlags t)) $ info (getId $ getCommandTokenOrThis t) 2162 "read without -r will mangle backslashes." checkReadWithoutR _ _ = return () prop_checkUncheckedCd1 = verifyTree checkUncheckedCdPushdPopd "cd ~/src; rm -r foo" prop_checkUncheckedCd2 = verifyNotTree checkUncheckedCdPushdPopd "cd ~/src || exit; rm -r foo" prop_checkUncheckedCd3 = verifyNotTree checkUncheckedCdPushdPopd "set -e; cd ~/src; rm -r foo" prop_checkUncheckedCd4 = verifyNotTree checkUncheckedCdPushdPopd "if cd foo; then rm foo; fi" prop_checkUncheckedCd5 = verifyTree checkUncheckedCdPushdPopd "if true; then cd foo; fi" prop_checkUncheckedCd6 = verifyNotTree checkUncheckedCdPushdPopd "cd .." prop_checkUncheckedCd7 = verifyNotTree checkUncheckedCdPushdPopd "#!/bin/bash -e\ncd foo\nrm bar" prop_checkUncheckedCd8 = verifyNotTree checkUncheckedCdPushdPopd "set -o errexit; cd foo; rm bar" prop_checkUncheckedCd9 = verifyTree checkUncheckedCdPushdPopd "builtin cd ~/src; rm -r foo" prop_checkUncheckedPushd1 = verifyTree checkUncheckedCdPushdPopd "pushd ~/src; rm -r foo" prop_checkUncheckedPushd2 = verifyNotTree checkUncheckedCdPushdPopd "pushd ~/src || exit; rm -r foo" prop_checkUncheckedPushd3 = verifyNotTree checkUncheckedCdPushdPopd "set -e; pushd ~/src; rm -r foo" prop_checkUncheckedPushd4 = verifyNotTree checkUncheckedCdPushdPopd "if pushd foo; then rm foo; fi" prop_checkUncheckedPushd5 = verifyTree checkUncheckedCdPushdPopd "if true; then pushd foo; fi" prop_checkUncheckedPushd6 = verifyNotTree checkUncheckedCdPushdPopd "pushd .." prop_checkUncheckedPushd7 = verifyNotTree checkUncheckedCdPushdPopd "#!/bin/bash -e\npushd foo\nrm bar" prop_checkUncheckedPushd8 = verifyNotTree checkUncheckedCdPushdPopd "set -o errexit; pushd foo; rm bar" prop_checkUncheckedPushd9 = verifyNotTree checkUncheckedCdPushdPopd "pushd -n foo" prop_checkUncheckedPopd1 = verifyTree checkUncheckedCdPushdPopd "popd; rm -r foo" prop_checkUncheckedPopd2 = verifyNotTree checkUncheckedCdPushdPopd "popd || exit; rm -r foo" prop_checkUncheckedPopd3 = verifyNotTree checkUncheckedCdPushdPopd "set -e; popd; rm -r foo" prop_checkUncheckedPopd4 = verifyNotTree checkUncheckedCdPushdPopd "if popd; then rm foo; fi" prop_checkUncheckedPopd5 = verifyTree checkUncheckedCdPushdPopd "if true; then popd; fi" prop_checkUncheckedPopd6 = verifyTree checkUncheckedCdPushdPopd "popd" prop_checkUncheckedPopd7 = verifyNotTree checkUncheckedCdPushdPopd "#!/bin/bash -e\npopd\nrm bar" prop_checkUncheckedPopd8 = verifyNotTree checkUncheckedCdPushdPopd "set -o errexit; popd; rm bar" prop_checkUncheckedPopd9 = verifyNotTree checkUncheckedCdPushdPopd "popd -n foo" prop_checkUncheckedPopd10 = verifyNotTree checkUncheckedCdPushdPopd "cd ../.." prop_checkUncheckedPopd11 = verifyNotTree checkUncheckedCdPushdPopd "cd ../.././.." prop_checkUncheckedPopd12 = verifyNotTree checkUncheckedCdPushdPopd "cd /" prop_checkUncheckedPopd13 = verifyTree checkUncheckedCdPushdPopd "cd ../../.../.." checkUncheckedCdPushdPopd params root = if hasSetE params then [] else execWriter $ doAnalysis checkElement root where checkElement t@T_SimpleCommand {} = do let name = getName t when(name `elem` ["cd", "pushd", "popd"] && not (isSafeDir t) && not (name `elem` ["pushd", "popd"] && ("n" `elem` map snd (getAllFlags t))) && not (isCondition $ getPath (parentMap params) t)) $ warnWithFix (getId t) 2164 ("Use '" ++ name ++ " ... || exit' or '" ++ name ++ " ... || return' in case " ++ name ++ " fails.") (fixWith [replaceEnd (getId t) params 0 " || exit"]) checkElement _ = return () getName t = fromMaybe "" $ getCommandName t isSafeDir t = case oversimplify t of [_, str] -> str `matches` regex _ -> False regex = mkRegex "^/*((\\.|\\.\\.)/+)*(\\.|\\.\\.)?$" prop_checkLoopVariableReassignment1 = verify checkLoopVariableReassignment "for i in *; do for i in *.bar; do true; done; done" prop_checkLoopVariableReassignment2 = verify checkLoopVariableReassignment "for i in *; do for((i=0; i<3; i++)); do true; done; done" prop_checkLoopVariableReassignment3 = verifyNot checkLoopVariableReassignment "for i in *; do for j in *.bar; do true; done; done" checkLoopVariableReassignment params token = potentially $ case token of T_ForIn {} -> check T_ForArithmetic {} -> check _ -> Nothing where check = do str <- loopVariable token next <- listToMaybe $ filter (\x -> loopVariable x == Just str) path return $ do warn (getId token) 2165 "This nested loop overrides the index variable of its parent." warn (getId next) 2167 "This parent loop has its index variable overridden." path = drop 1 $ getPath (parentMap params) token loopVariable :: Token -> Maybe String loopVariable t = case t of T_ForIn _ s _ _ -> return s T_ForArithmetic _ (TA_Sequence _ [TA_Assignment _ "=" (TA_Variable _ var _ ) _]) _ _ _ -> return var _ -> fail "not loop" prop_checkTrailingBracket1 = verify checkTrailingBracket "if -z n ]]; then true; fi " prop_checkTrailingBracket2 = verifyNot checkTrailingBracket "if [[ -z n ]]; then true; fi " prop_checkTrailingBracket3 = verify checkTrailingBracket "a || b ] && thing" prop_checkTrailingBracket4 = verifyNot checkTrailingBracket "run [ foo ]" prop_checkTrailingBracket5 = verifyNot checkTrailingBracket "run bar ']'" checkTrailingBracket _ token = case token of T_SimpleCommand _ _ tokens@(_:_) -> check (last tokens) token _ -> return () where check t command = case t of T_NormalWord id [T_Literal _ str] -> potentially $ do guard $ str `elem` [ "]]", "]" ] let opposite = invert str parameters = oversimplify command guard $ opposite `notElem` parameters return $ warn id 2171 $ "Found trailing " ++ str ++ " outside test. Add missing " ++ opposite ++ " or quote if intentional." _ -> return () invert s = case s of "]]" -> "[[" "]" -> "[" x -> x prop_checkReturnAgainstZero1 = verify checkReturnAgainstZero "[ $? -eq 0 ]" prop_checkReturnAgainstZero2 = verify checkReturnAgainstZero "[[ \"$?\" -gt 0 ]]" prop_checkReturnAgainstZero3 = verify checkReturnAgainstZero "[[ 0 -ne $? ]]" prop_checkReturnAgainstZero4 = verifyNot checkReturnAgainstZero "[[ $? -eq 4 ]]" prop_checkReturnAgainstZero5 = verify checkReturnAgainstZero "[[ 0 -eq $? ]]" prop_checkReturnAgainstZero6 = verifyNot checkReturnAgainstZero "[[ $R -eq 0 ]]" prop_checkReturnAgainstZero7 = verify checkReturnAgainstZero "(( $? == 0 ))" prop_checkReturnAgainstZero8 = verify checkReturnAgainstZero "(( $? ))" prop_checkReturnAgainstZero9 = verify checkReturnAgainstZero "(( ! $? ))" checkReturnAgainstZero _ token = case token of TC_Binary id _ _ lhs rhs -> check lhs rhs TA_Binary id _ lhs rhs -> check lhs rhs TA_Unary id _ exp -> when (isExitCode exp) $ message (getId exp) TA_Sequence _ [exp] -> when (isExitCode exp) $ message (getId exp) _ -> return () where check lhs rhs = if isZero rhs && isExitCode lhs then message (getId lhs) else when (isZero lhs && isExitCode rhs) $ message (getId rhs) isZero t = getLiteralString t == Just "0" isExitCode t = case getWordParts t of [exp@T_DollarBraced {}] -> bracedString exp == "?" _ -> False message id = style id 2181 "Check exit code directly with e.g. 'if mycmd;', not indirectly with $?." prop_checkRedirectedNowhere1 = verify checkRedirectedNowhere "> file" prop_checkRedirectedNowhere2 = verify checkRedirectedNowhere "> file | grep foo" prop_checkRedirectedNowhere3 = verify checkRedirectedNowhere "grep foo | > bar" prop_checkRedirectedNowhere4 = verifyNot checkRedirectedNowhere "grep foo > bar" prop_checkRedirectedNowhere5 = verifyNot checkRedirectedNowhere "foo | grep bar > baz" prop_checkRedirectedNowhere6 = verifyNot checkRedirectedNowhere "var=$(value) 2> /dev/null" prop_checkRedirectedNowhere7 = verifyNot checkRedirectedNowhere "var=$(< file)" prop_checkRedirectedNowhere8 = verifyNot checkRedirectedNowhere "var=`< file`" checkRedirectedNowhere params token = case token of T_Pipeline _ _ [single] -> potentially $ do redir <- getDanglingRedirect single guard . not $ isInExpansion token return $ warn (getId redir) 2188 "This redirection doesn't have a command. Move to its command (or use 'true' as no-op)." T_Pipeline _ _ list -> forM_ list $ \x -> potentially $ do redir <- getDanglingRedirect x return $ err (getId redir) 2189 "You can't have | between this redirection and the command it should apply to." _ -> return () where isInExpansion t = case drop 1 $ getPath (parentMap params) t of T_DollarExpansion _ [_] : _ -> True T_Backticked _ [_] : _ -> True t@T_Annotation {} : _ -> isInExpansion t _ -> False getDanglingRedirect token = case token of T_Redirecting _ (first:_) (T_SimpleCommand _ [] []) -> return first _ -> Nothing prop_checkArrayAssignmentIndices1 = verifyTree checkArrayAssignmentIndices "declare -A foo; foo=(bar)" prop_checkArrayAssignmentIndices2 = verifyNotTree checkArrayAssignmentIndices "declare -a foo; foo=(bar)" prop_checkArrayAssignmentIndices3 = verifyNotTree checkArrayAssignmentIndices "declare -A foo; foo=([i]=bar)" prop_checkArrayAssignmentIndices4 = verifyTree checkArrayAssignmentIndices "typeset -A foo; foo+=(bar)" prop_checkArrayAssignmentIndices5 = verifyTree checkArrayAssignmentIndices "arr=( [foo]= bar )" prop_checkArrayAssignmentIndices6 = verifyTree checkArrayAssignmentIndices "arr=( [foo] = bar )" prop_checkArrayAssignmentIndices7 = verifyTree checkArrayAssignmentIndices "arr=( var=value )" prop_checkArrayAssignmentIndices8 = verifyNotTree checkArrayAssignmentIndices "arr=( [foo]=bar )" prop_checkArrayAssignmentIndices9 = verifyNotTree checkArrayAssignmentIndices "arr=( [foo]=\"\" )" checkArrayAssignmentIndices params root = runNodeAnalysis check params root where assocs = getAssociativeArrays root check _ t = case t of T_Assignment _ _ name [] (T_Array _ list) -> let isAssoc = name `elem` assocs in mapM_ (checkElement isAssoc) list _ -> return () checkElement isAssociative t = case t of T_IndexedElement _ _ (T_Literal id "") -> warn id 2192 "This array element has no value. Remove spaces after = or use \"\" for empty string." T_IndexedElement {} -> return () T_NormalWord _ parts -> let literalEquals = do part <- parts (id, str) <- case part of T_Literal id str -> [(id,str)] _ -> [] guard $ '=' `elem` str return $ warnWithFix id 2191 "The = here is literal. To assign by index, use ( [index]=value ) with no spaces. To keep as literal, quote it." (surroundWidth id params "\"") in if null literalEquals && isAssociative then warn (getId t) 2190 "Elements in associative arrays need index, e.g. array=( [index]=value ) ." else sequence_ literalEquals _ -> return () prop_checkUnmatchableCases1 = verify checkUnmatchableCases "case foo in bar) true; esac" prop_checkUnmatchableCases2 = verify checkUnmatchableCases "case foo-$bar in ??|*) true; esac" prop_checkUnmatchableCases3 = verify checkUnmatchableCases "case foo in foo) true; esac" prop_checkUnmatchableCases4 = verifyNot checkUnmatchableCases "case foo-$bar in foo*|*bar|*baz*) true; esac" prop_checkUnmatchableCases5 = verify checkUnmatchableCases "case $f in *.txt) true;; f??.txt) false;; esac" prop_checkUnmatchableCases6 = verifyNot checkUnmatchableCases "case $f in ?*) true;; *) false;; esac" prop_checkUnmatchableCases7 = verifyNot checkUnmatchableCases "case $f in $(x)) true;; asdf) false;; esac" prop_checkUnmatchableCases8 = verify checkUnmatchableCases "case $f in cow) true;; bar|cow) false;; esac" prop_checkUnmatchableCases9 = verifyNot checkUnmatchableCases "case $f in x) true;;& x) false;; esac" checkUnmatchableCases params t = case t of T_CaseExpression _ word list -> do -- Check all patterns for whether they can ever match let allpatterns = concatMap snd3 list -- Check only the non-fallthrough branches for shadowing let breakpatterns = concatMap snd3 $ filter (\x -> fst3 x == CaseBreak) list if isConstant word then warn (getId word) 2194 "This word is constant. Did you forget the $ on a variable?" else potentially $ do pg <- wordToPseudoGlob word return $ mapM_ (check pg) allpatterns let exactGlobs = tupMap wordToExactPseudoGlob breakpatterns let fuzzyGlobs = tupMap wordToPseudoGlob breakpatterns let dominators = zip exactGlobs (tails $ drop 1 fuzzyGlobs) mapM_ checkDoms dominators _ -> return () where fst3 (x,_,_) = x snd3 (_,x,_) = x tp = tokenPositions params check target candidate = potentially $ do candidateGlob <- wordToPseudoGlob candidate guard . not $ pseudoGlobsCanOverlap target candidateGlob return $ warn (getId candidate) 2195 "This pattern will never match the case statement's word. Double check them." tupMap f l = zip l (map f l) checkDoms ((glob, Just x), rest) = case filter (\(_, p) -> x `pseudoGlobIsSuperSetof` p) valids of ((first,_):_) -> do warn (getId glob) 2221 $ "This pattern always overrides a later one" <> patternContext (getId first) warn (getId first) 2222 $ "This pattern never matches because of a previous pattern" <> patternContext (getId glob) _ -> return () where patternContext :: Id -> String patternContext id = case posLine . fst <$> Map.lookup id tp of Just l -> " on line " <> show l <> "." _ -> "." valids = concatMap f rest f (x, Just y) = [(x,y)] f _ = [] checkDoms _ = return () prop_checkSubshellAsTest1 = verify checkSubshellAsTest "( -e file )" prop_checkSubshellAsTest2 = verify checkSubshellAsTest "( 1 -gt 2 )" prop_checkSubshellAsTest3 = verifyNot checkSubshellAsTest "( grep -c foo bar )" prop_checkSubshellAsTest4 = verifyNot checkSubshellAsTest "[ 1 -gt 2 ]" prop_checkSubshellAsTest5 = verify checkSubshellAsTest "( -e file && -x file )" prop_checkSubshellAsTest6 = verify checkSubshellAsTest "( -e file || -x file && -t 1 )" prop_checkSubshellAsTest7 = verify checkSubshellAsTest "( ! -d file )" checkSubshellAsTest _ t = case t of T_Subshell id [w] -> check id w _ -> return () where check id t = case t of (T_Banged _ w) -> check id w (T_AndIf _ w _) -> check id w (T_OrIf _ w _) -> check id w (T_Pipeline _ _ [T_Redirecting _ _ (T_SimpleCommand _ [] (first:second:_))]) -> checkParams id first second _ -> return () checkParams id first second = do when (fromMaybe False $ (`elem` unaryTestOps) <$> getLiteralString first) $ err id 2204 "(..) is a subshell. Did you mean [ .. ], a test expression?" when (fromMaybe False $ (`elem` binaryTestOps) <$> getLiteralString second) $ warn id 2205 "(..) is a subshell. Did you mean [ .. ], a test expression?" prop_checkSplittingInArrays1 = verify checkSplittingInArrays "a=( $var )" prop_checkSplittingInArrays2 = verify checkSplittingInArrays "a=( $(cmd) )" prop_checkSplittingInArrays3 = verifyNot checkSplittingInArrays "a=( \"$var\" )" prop_checkSplittingInArrays4 = verifyNot checkSplittingInArrays "a=( \"$(cmd)\" )" prop_checkSplittingInArrays5 = verifyNot checkSplittingInArrays "a=( $! $$ $# )" prop_checkSplittingInArrays6 = verifyNot checkSplittingInArrays "a=( ${#arr[@]} )" prop_checkSplittingInArrays7 = verifyNot checkSplittingInArrays "a=( foo{1,2} )" prop_checkSplittingInArrays8 = verifyNot checkSplittingInArrays "a=( * )" checkSplittingInArrays params t = case t of T_Array _ elements -> mapM_ check elements _ -> return () where check word = case word of T_NormalWord _ parts -> mapM_ checkPart parts _ -> return () checkPart part = case part of T_DollarExpansion id _ -> forCommand id T_DollarBraceCommandExpansion id _ -> forCommand id T_Backticked id _ -> forCommand id T_DollarBraced id _ str | not (isCountingReference part) && not (isQuotedAlternativeReference part) && not (getBracedReference (bracedString part) `elem` variablesWithoutSpaces) -> warn id 2206 $ if shellType params == Ksh then "Quote to prevent word splitting/globbing, or split robustly with read -A or while read." else "Quote to prevent word splitting/globbing, or split robustly with mapfile or read -a." _ -> return () forCommand id = warn id 2207 $ if shellType params == Ksh then "Prefer read -A or while read to split command output (or quote to avoid splitting)." else "Prefer mapfile or read -a to split command output (or quote to avoid splitting)." prop_checkRedirectionToNumber1 = verify checkRedirectionToNumber "( 1 > 2 )" prop_checkRedirectionToNumber2 = verify checkRedirectionToNumber "foo 1>2" prop_checkRedirectionToNumber3 = verifyNot checkRedirectionToNumber "echo foo > '2'" prop_checkRedirectionToNumber4 = verifyNot checkRedirectionToNumber "foo 1>&2" checkRedirectionToNumber _ t = case t of T_IoFile id _ word -> potentially $ do file <- getUnquotedLiteral word guard $ all isDigit file return $ warn id 2210 "This is a file redirection. Was it supposed to be a comparison or fd operation?" _ -> return () prop_checkGlobAsCommand1 = verify checkGlobAsCommand "foo*" prop_checkGlobAsCommand2 = verify checkGlobAsCommand "$(var[i])" prop_checkGlobAsCommand3 = verifyNot checkGlobAsCommand "echo foo*" checkGlobAsCommand _ t = case t of T_SimpleCommand _ _ (first:_) -> when (isGlob first) $ warn (getId first) 2211 "This is a glob used as a command name. Was it supposed to be in ${..}, array, or is it missing quoting?" _ -> return () prop_checkFlagAsCommand1 = verify checkFlagAsCommand "-e file" prop_checkFlagAsCommand2 = verify checkFlagAsCommand "foo\n --bar=baz" prop_checkFlagAsCommand3 = verifyNot checkFlagAsCommand "'--myexec--' args" prop_checkFlagAsCommand4 = verifyNot checkFlagAsCommand "var=cmd --arg" -- Handled by SC2037 checkFlagAsCommand _ t = case t of T_SimpleCommand _ [] (first:_) -> when (isUnquotedFlag first) $ warn (getId first) 2215 "This flag is used as a command name. Bad line break or missing [ .. ]?" _ -> return () prop_checkEmptyCondition1 = verify checkEmptyCondition "if [ ]; then ..; fi" prop_checkEmptyCondition2 = verifyNot checkEmptyCondition "[ foo -o bar ]" checkEmptyCondition _ t = case t of TC_Empty id _ -> style id 2212 "Use 'false' instead of empty [/[[ conditionals." _ -> return () prop_checkPipeToNowhere1 = verify checkPipeToNowhere "foo | echo bar" prop_checkPipeToNowhere2 = verify checkPipeToNowhere "basename < file.txt" prop_checkPipeToNowhere3 = verify checkPipeToNowhere "printf 'Lol' <<< str" prop_checkPipeToNowhere4 = verify checkPipeToNowhere "printf 'Lol' << eof\nlol\neof\n" prop_checkPipeToNowhere5 = verifyNot checkPipeToNowhere "echo foo | xargs du" prop_checkPipeToNowhere6 = verifyNot checkPipeToNowhere "ls | echo $(cat)" prop_checkPipeToNowhere7 = verifyNot checkPipeToNowhere "echo foo | var=$(cat) ls" prop_checkPipeToNowhere8 = verify checkPipeToNowhere "foo | true" prop_checkPipeToNowhere9 = verifyNot checkPipeToNowhere "mv -i f . < /dev/stdin" checkPipeToNowhere :: Parameters -> Token -> WriterT [TokenComment] Identity () checkPipeToNowhere _ t = case t of T_Pipeline _ _ (first:rest) -> mapM_ checkPipe rest T_Redirecting _ redirects cmd -> when (any redirectsStdin redirects) $ checkRedir cmd _ -> return () where checkPipe redir = potentially $ do cmd <- getCommand redir name <- getCommandBasename cmd guard $ name `elem` nonReadingCommands guard . not $ hasAdditionalConsumers cmd -- Confusing echo for cat is so common that it's worth a special case let suggestion = if name == "echo" then "Did you want 'cat' instead?" else "Wrong command or missing xargs?" return $ warn (getId cmd) 2216 $ "Piping to '" ++ name ++ "', a command that doesn't read stdin. " ++ suggestion checkRedir cmd = potentially $ do name <- getCommandBasename cmd guard $ name `elem` nonReadingCommands guard . not $ hasAdditionalConsumers cmd guard . not $ name `elem` ["cp", "mv", "rm"] && cmd `hasFlag` "i" let suggestion = if name == "echo" then "Did you want 'cat' instead?" else "Bad quoting, wrong command or missing xargs?" return $ warn (getId cmd) 2217 $ "Redirecting to '" ++ name ++ "', a command that doesn't read stdin. " ++ suggestion -- Could any words in a SimpleCommand consume stdin (e.g. echo "$(cat)")? hasAdditionalConsumers t = fromMaybe True $ do doAnalysis (guard . not . mayConsume) t return False mayConsume t = case t of T_ProcSub {} -> True T_Backticked {} -> True T_DollarExpansion {} -> True _ -> False redirectsStdin t = case t of T_FdRedirect _ _ (T_IoFile _ T_Less {} _) -> True T_FdRedirect _ _ T_HereDoc {} -> True T_FdRedirect _ _ T_HereString {} -> True _ -> False prop_checkUseBeforeDefinition1 = verifyTree checkUseBeforeDefinition "f; f() { true; }" prop_checkUseBeforeDefinition2 = verifyNotTree checkUseBeforeDefinition "f() { true; }; f" prop_checkUseBeforeDefinition3 = verifyNotTree checkUseBeforeDefinition "if ! mycmd --version; then mycmd() { true; }; fi" prop_checkUseBeforeDefinition4 = verifyNotTree checkUseBeforeDefinition "mycmd || mycmd() { f; }" checkUseBeforeDefinition _ t = execWriter $ evalStateT (mapM_ examine $ revCommands) Map.empty where examine t = case t of T_Pipeline _ _ [T_Redirecting _ _ (T_Function _ _ _ name _)] -> modify $ Map.insert name t T_Annotation _ _ w -> examine w T_Pipeline _ _ cmds -> do m <- get unless (Map.null m) $ mapM_ (checkUsage m) $ concatMap recursiveSequences cmds _ -> return () checkUsage map cmd = potentially $ do name <- getCommandName cmd def <- Map.lookup name map return $ err (getId cmd) 2218 "This function is only defined later. Move the definition up." revCommands = reverse $ concat $ getCommandSequences t recursiveSequences x = let list = concat $ getCommandSequences x in if null list then [x] else concatMap recursiveSequences list prop_checkForLoopGlobVariables1 = verify checkForLoopGlobVariables "for i in $var/*.txt; do true; done" prop_checkForLoopGlobVariables2 = verifyNot checkForLoopGlobVariables "for i in \"$var\"/*.txt; do true; done" prop_checkForLoopGlobVariables3 = verifyNot checkForLoopGlobVariables "for i in $var; do true; done" checkForLoopGlobVariables _ t = case t of T_ForIn _ _ words _ -> mapM_ check words _ -> return () where check (T_NormalWord _ parts) = when (any isGlob parts) $ mapM_ suggest $ filter isQuoteableExpansion parts suggest t = info (getId t) 2231 "Quote expansions in this for loop glob to prevent wordsplitting, e.g. \"$dir\"/*.txt ." prop_checkSubshelledTests1 = verify checkSubshelledTests "a && ( [ b ] || ! [ c ] )" prop_checkSubshelledTests2 = verify checkSubshelledTests "( [ a ] )" prop_checkSubshelledTests3 = verify checkSubshelledTests "( [ a ] && [ b ] || test c )" prop_checkSubshelledTests4 = verify checkSubshelledTests "( [ a ] && { [ b ] && [ c ]; } )" checkSubshelledTests params t = case t of T_Subshell id list | all isTestStructure list -> case () of -- Special case for if (test) and while (test) _ | isCompoundCondition (getPath (parentMap params) t) -> style id 2233 "Remove superfluous (..) around condition." -- Special case for ([ x ]) _ | isSingleTest list -> style id 2234 "Remove superfluous (..) around test command." -- General case for ([ x ] || [ y ] && etc) _ -> style id 2235 "Use { ..; } instead of (..) to avoid subshell overhead." _ -> return () where isSingleTest cmds = case cmds of [c] | isTestCommand c -> True _ -> False isTestStructure t = case t of T_Banged _ t -> isTestStructure t T_AndIf _ a b -> isTestStructure a && isTestStructure b T_OrIf _ a b -> isTestStructure a && isTestStructure b T_Pipeline _ [] [T_Redirecting _ _ cmd] -> case cmd of T_BraceGroup _ ts -> all isTestStructure ts T_Subshell _ ts -> all isTestStructure ts _ -> isTestCommand t _ -> isTestCommand t isTestCommand t = case t of T_Pipeline _ [] [T_Redirecting _ _ cmd] -> case cmd of T_Condition {} -> True _ -> cmd `isCommand` "test" _ -> False -- Check if a T_Subshell is used as a condition, e.g. if ( test ) -- This technically also triggers for `if true; then ( test ); fi` -- but it's still a valid suggestion. isCompoundCondition chain = case dropWhile skippable (drop 1 chain) of T_IfExpression {} : _ -> True T_WhileExpression {} : _ -> True T_UntilExpression {} : _ -> True _ -> False -- Skip any parent of a T_Subshell until we reach something interesting skippable t = case t of T_Redirecting _ [] _ -> True T_Pipeline _ [] _ -> True T_Annotation {} -> True _ -> False prop_checkInvertedStringTest1 = verify checkInvertedStringTest "[ ! -z $var ]" prop_checkInvertedStringTest2 = verify checkInvertedStringTest "! [[ -n $var ]]" prop_checkInvertedStringTest3 = verifyNot checkInvertedStringTest "! [ -x $var ]" prop_checkInvertedStringTest4 = verifyNot checkInvertedStringTest "[[ ! -w $var ]]" prop_checkInvertedStringTest5 = verifyNot checkInvertedStringTest "[ -z $var ]" checkInvertedStringTest _ t = case t of TC_Unary _ _ "!" (TC_Unary _ _ op _) -> case op of "-n" -> style (getId t) 2236 "Use -z instead of ! -n." "-z" -> style (getId t) 2236 "Use -n instead of ! -z." _ -> return () T_Banged _ (T_Pipeline _ _ [T_Redirecting _ _ (T_Condition _ _ (TC_Unary _ _ op _))]) -> case op of "-n" -> style (getId t) 2237 "Use [ -z .. ] instead of ! [ -n .. ]." "-z" -> style (getId t) 2237 "Use [ -n .. ] instead of ! [ -z .. ]." _ -> return () _ -> return () prop_checkRedirectionToCommand1 = verify checkRedirectionToCommand "ls > rm" prop_checkRedirectionToCommand2 = verifyNot checkRedirectionToCommand "ls > 'rm'" prop_checkRedirectionToCommand3 = verifyNot checkRedirectionToCommand "ls > myfile" checkRedirectionToCommand _ t = case t of T_IoFile _ _ (T_NormalWord id [T_Literal _ str]) | str `elem` commonCommands -> unless (str == "file") $ -- This would be confusing warn id 2238 "Redirecting to/from command name instead of file. Did you want pipes/xargs (or quote to ignore)?" _ -> return () prop_checkNullaryExpansionTest1 = verify checkNullaryExpansionTest "[[ $(a) ]]" prop_checkNullaryExpansionTest2 = verify checkNullaryExpansionTest "[[ $a ]]" prop_checkNullaryExpansionTest3 = verifyNot checkNullaryExpansionTest "[[ $a=1 ]]" prop_checkNullaryExpansionTest4 = verifyNot checkNullaryExpansionTest "[[ -n $(a) ]]" prop_checkNullaryExpansionTest5 = verify checkNullaryExpansionTest "[[ \"$a$b\" ]]" prop_checkNullaryExpansionTest6 = verify checkNullaryExpansionTest "[[ `x` ]]" checkNullaryExpansionTest params t = case t of TC_Nullary _ _ word -> case getWordParts word of [t] | isCommandSubstitution t -> styleWithFix id 2243 "Prefer explicit -n to check for output (or run command without [/[[ to check for success)." fix -- If they're constant, you get SC2157 &co x | all (not . isConstant) x -> styleWithFix id 2244 "Prefer explicit -n to check non-empty string (or use =/-ne to check boolean/integer)." fix _ -> return () where id = getId word fix = fixWith [replaceStart id params 0 "-n "] _ -> return () prop_checkDollarQuoteParen1 = verify checkDollarQuoteParen "$\"(foo)\"" prop_checkDollarQuoteParen2 = verify checkDollarQuoteParen "$\"{foo}\"" prop_checkDollarQuoteParen3 = verifyNot checkDollarQuoteParen "\"$(foo)\"" prop_checkDollarQuoteParen4 = verifyNot checkDollarQuoteParen "$\"..\"" checkDollarQuoteParen params t = case t of T_DollarDoubleQuoted id ((T_Literal _ (c:_)):_) | c `elem` "({" -> warnWithFix id 2247 "Flip leading $ and \" if this should be a quoted substitution." (fix id) _ -> return () where fix id = fixWith [replaceStart id params 2 "\"$"] prop_checkDefaultCase1 = verify checkDefaultCase "case $1 in a) true ;; esac" prop_checkDefaultCase2 = verify checkDefaultCase "case $1 in ?*?) true ;; *? ) true ;; esac" prop_checkDefaultCase3 = verifyNot checkDefaultCase "case $1 in x|*) true ;; esac" prop_checkDefaultCase4 = verifyNot checkDefaultCase "case $1 in **) true ;; esac" checkDefaultCase _ t = case t of T_CaseExpression id _ list -> unless (any canMatchAny list) $ info id 2249 "Consider adding a default *) case, even if it just exits with error." _ -> return () where canMatchAny (_, list, _) = any canMatchAny' list -- hlint objects to 'pattern' as a variable name canMatchAny' pat = fromMaybe False $ do pg <- wordToExactPseudoGlob pat return $ pseudoGlobIsSuperSetof pg [PGMany] prop_checkUselessBang1 = verify checkUselessBang "set -e; ! true; rest" prop_checkUselessBang2 = verifyNot checkUselessBang "! true; rest" prop_checkUselessBang3 = verify checkUselessBang "set -e; while true; do ! true; done" prop_checkUselessBang4 = verifyNot checkUselessBang "set -e; if ! true; then true; fi" prop_checkUselessBang5 = verifyNot checkUselessBang "set -e; ( ! true )" prop_checkUselessBang6 = verify checkUselessBang "set -e; { ! true; }" prop_checkUselessBang7 = verifyNot checkUselessBang "set -e; x() { ! [ x ]; }" prop_checkUselessBang8 = verifyNot checkUselessBang "set -e; if { ! true; }; then true; fi" prop_checkUselessBang9 = verifyNot checkUselessBang "set -e; while ! true; do true; done" checkUselessBang params t = when (hasSetE params) $ mapM_ check (getNonReturningCommands t) where check t = case t of T_Banged id cmd | not $ isCondition (getPath (parentMap params) t) -> addComment $ makeCommentWithFix InfoC id 2251 "This ! is not on a condition and skips errexit. Use `&& exit 1` instead, or make sure $? is checked." (fixWith [replaceStart id params 1 "", replaceEnd (getId cmd) params 0 " && exit 1"]) _ -> return () -- Get all the subcommands that aren't likely to be the return value getNonReturningCommands :: Token -> [Token] getNonReturningCommands t = case t of T_Script _ _ list -> dropLast list T_BraceGroup _ list -> if isFunctionBody t then dropLast list else list T_Subshell _ list -> dropLast list T_WhileExpression _ conds cmds -> dropLast conds ++ cmds T_UntilExpression _ conds cmds -> dropLast conds ++ cmds T_ForIn _ _ _ list -> list T_ForArithmetic _ _ _ _ list -> list T_Annotation _ _ t -> getNonReturningCommands t T_IfExpression _ conds elses -> concatMap (dropLast . fst) conds ++ concatMap snd conds ++ elses _ -> [] isFunctionBody t = case getPath (parentMap params) t of _:T_Function {}:_-> True _ -> False dropLast t = case t of [_] -> [] x:rest -> x : dropLast rest _ -> [] return [] runTests = $( [| $(forAllProperties) (quickCheckWithResult (stdArgs { maxSuccess = 1 }) ) |]) ShellCheck-0.7.0/src/ShellCheck/Analyzer.hs0000644000000000000000000000321613517444075016642 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Analyzer (analyzeScript, ShellCheck.Analyzer.optionalChecks) where import ShellCheck.Analytics import ShellCheck.AnalyzerLib import ShellCheck.Interface import Data.List import Data.Monoid import qualified ShellCheck.Checks.Commands import qualified ShellCheck.Checks.Custom import qualified ShellCheck.Checks.ShellSupport -- TODO: Clean up the cruft this is layered on analyzeScript :: AnalysisSpec -> AnalysisResult analyzeScript spec = newAnalysisResult { arComments = filterByAnnotation spec params . nub $ runAnalytics spec ++ runChecker params (checkers params) } where params = makeParameters spec checkers params = mconcat $ map ($ params) [ ShellCheck.Checks.Commands.checker, ShellCheck.Checks.Custom.checker, ShellCheck.Checks.ShellSupport.checker ] optionalChecks = mconcat $ [ ShellCheck.Analytics.optionalChecks ] ShellCheck-0.7.0/src/ShellCheck/AnalyzerLib.hs0000644000000000000000000010645213517444075017277 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE FlexibleContexts #-} {-# LANGUAGE TemplateHaskell #-} module ShellCheck.AnalyzerLib where import ShellCheck.AST import ShellCheck.ASTLib import ShellCheck.Data import ShellCheck.Interface import ShellCheck.Parser import ShellCheck.Regex import Control.Arrow (first) import Control.DeepSeq import Control.Monad.Identity import Control.Monad.RWS import Control.Monad.State import Control.Monad.Writer import Data.Char import Data.List import Data.Maybe import Data.Semigroup import qualified Data.Map as Map import Test.QuickCheck.All (forAllProperties) import Test.QuickCheck.Test (maxSuccess, quickCheckWithResult, stdArgs) type Analysis = AnalyzerM () type AnalyzerM a = RWS Parameters [TokenComment] Cache a nullCheck = const $ return () data Checker = Checker { perScript :: Root -> Analysis, perToken :: Token -> Analysis } runChecker :: Parameters -> Checker -> [TokenComment] runChecker params checker = notes where root = rootNode params check = perScript checker `composeAnalyzers` (\(Root x) -> void $ doAnalysis (perToken checker) x) notes = snd $ evalRWS (check $ Root root) params Cache instance Semigroup Checker where (<>) x y = Checker { perScript = perScript x `composeAnalyzers` perScript y, perToken = perToken x `composeAnalyzers` perToken y } instance Monoid Checker where mempty = Checker { perScript = nullCheck, perToken = nullCheck } mappend = (Data.Semigroup.<>) composeAnalyzers :: (a -> Analysis) -> (a -> Analysis) -> a -> Analysis composeAnalyzers f g x = f x >> g x data Parameters = Parameters { -- Whether this script has the 'lastpipe' option set/default. hasLastpipe :: Bool, -- Whether this script has 'set -e' anywhere. hasSetE :: Bool, -- A linear (bad) analysis of data flow variableFlow :: [StackData], -- A map from Id to parent Token parentMap :: Map.Map Id Token, -- The shell type, such as Bash or Ksh shellType :: Shell, -- True if shell type was forced via flags shellTypeSpecified :: Bool, -- The root node of the AST rootNode :: Token, -- map from token id to start and end position tokenPositions :: Map.Map Id (Position, Position) } deriving (Show) -- TODO: Cache results of common AST ops here data Cache = Cache {} data Scope = SubshellScope String | NoneScope deriving (Show, Eq) data StackData = StackScope Scope | StackScopeEnd -- (Base expression, specific position, var name, assigned values) | Assignment (Token, Token, String, DataType) | Reference (Token, Token, String) deriving (Show) data DataType = DataString DataSource | DataArray DataSource deriving (Show) data DataSource = SourceFrom [Token] | SourceExternal | SourceDeclaration | SourceInteger | SourceChecked deriving (Show) data VariableState = Dead Token String | Alive deriving (Show) defaultSpec pr = spec { asShellType = Nothing, asCheckSourced = False, asExecutionMode = Executed, asTokenPositions = prTokenPositions pr } where spec = newAnalysisSpec (fromJust $ prRoot pr) pScript s = let pSpec = newParseSpec { psFilename = "script", psScript = s } in runIdentity $ parseScript (mockedSystemInterface []) pSpec -- For testing. If parsed, returns whether there are any comments producesComments :: Checker -> String -> Maybe Bool producesComments c s = do let pr = pScript s prRoot pr let spec = defaultSpec pr let params = makeParameters spec return . not . null $ runChecker params c makeComment :: Severity -> Id -> Code -> String -> TokenComment makeComment severity id code note = newTokenComment { tcId = id, tcComment = newComment { cSeverity = severity, cCode = code, cMessage = note } } addComment note = note `deepseq` tell [note] warn :: MonadWriter [TokenComment] m => Id -> Code -> String -> m () warn id code str = addComment $ makeComment WarningC id code str err id code str = addComment $ makeComment ErrorC id code str info id code str = addComment $ makeComment InfoC id code str style id code str = addComment $ makeComment StyleC id code str warnWithFix :: MonadWriter [TokenComment] m => Id -> Code -> String -> Fix -> m () warnWithFix = addCommentWithFix WarningC styleWithFix :: MonadWriter [TokenComment] m => Id -> Code -> String -> Fix -> m () styleWithFix = addCommentWithFix StyleC addCommentWithFix :: MonadWriter [TokenComment] m => Severity -> Id -> Code -> String -> Fix -> m () addCommentWithFix severity id code str fix = addComment $ makeCommentWithFix severity id code str fix makeCommentWithFix :: Severity -> Id -> Code -> String -> Fix -> TokenComment makeCommentWithFix severity id code str fix = let comment = makeComment severity id code str withFix = comment { tcFix = Just fix } in withFix `deepseq` withFix makeParameters spec = let params = Parameters { rootNode = root, shellType = fromMaybe (determineShell (asFallbackShell spec) root) $ asShellType spec, hasSetE = containsSetE root, hasLastpipe = case shellType params of Bash -> containsLastpipe root Dash -> False Sh -> False Ksh -> True, shellTypeSpecified = isJust (asShellType spec) || isJust (asFallbackShell spec), parentMap = getParentTree root, variableFlow = getVariableFlow params root, tokenPositions = asTokenPositions spec } in params where root = asScript spec -- Does this script mention 'set -e' anywhere? -- Used as a hack to disable certain warnings. containsSetE root = isNothing $ doAnalysis (guard . not . isSetE) root where isSetE t = case t of T_Script _ (T_Literal _ str) _ -> str `matches` re T_SimpleCommand {} -> t `isUnqualifiedCommand` "set" && ("errexit" `elem` oversimplify t || "e" `elem` map snd (getAllFlags t)) _ -> False re = mkRegex "[[:space:]]-[^-]*e" -- Does this script mention 'shopt -s lastpipe' anywhere? -- Also used as a hack. containsLastpipe root = isNothing $ doAnalysis (guard . not . isShoptLastPipe) root where isShoptLastPipe t = case t of T_SimpleCommand {} -> t `isUnqualifiedCommand` "shopt" && ("lastpipe" `elem` oversimplify t) _ -> False prop_determineShell0 = determineShellTest "#!/bin/sh" == Sh prop_determineShell1 = determineShellTest "#!/usr/bin/env ksh" == Ksh prop_determineShell2 = determineShellTest "" == Bash prop_determineShell3 = determineShellTest "#!/bin/sh -e" == Sh prop_determineShell4 = determineShellTest "#!/bin/ksh\n#shellcheck shell=sh\nfoo" == Sh prop_determineShell5 = determineShellTest "#shellcheck shell=sh\nfoo" == Sh prop_determineShell6 = determineShellTest "#! /bin/sh" == Sh prop_determineShell7 = determineShellTest "#! /bin/ash" == Dash prop_determineShell8 = determineShellTest' (Just Ksh) "#!/bin/sh" == Sh determineShellTest = determineShellTest' Nothing determineShellTest' fallbackShell = determineShell fallbackShell . fromJust . prRoot . pScript determineShell fallbackShell t = fromMaybe Bash $ do shellString <- foldl mplus Nothing $ getCandidates t shellForExecutable shellString `mplus` fallbackShell where forAnnotation t = case t of (ShellOverride s) -> return s _ -> fail "" getCandidates :: Token -> [Maybe String] getCandidates t@T_Script {} = [Just $ fromShebang t] getCandidates (T_Annotation _ annotations s) = map forAnnotation annotations ++ [Just $ fromShebang s] fromShebang (T_Script _ (T_Literal _ s) _) = executableFromShebang s -- Given a string like "/bin/bash" or "/usr/bin/env dash", -- return the shell basename like "bash" or "dash" executableFromShebang :: String -> String executableFromShebang = shellFor where shellFor s | "/env " `isInfixOf` s = head (drop 1 (words s)++[""]) shellFor s | ' ' `elem` s = shellFor $ takeWhile (/= ' ') s shellFor s = reverse . takeWhile (/= '/') . reverse $ s -- Given a root node, make a map from Id to parent Token. -- This is used to populate parentMap in Parameters getParentTree :: Token -> Map.Map Id Token getParentTree t = snd . snd $ runState (doStackAnalysis pre post t) ([], Map.empty) where pre t = modify (first ((:) t)) post t = do (x, map) <- get case x of _:rest -> case rest of [] -> put (rest, map) (x:_) -> put (rest, Map.insert (getId t) x map) -- Given a root node, make a map from Id to Token getTokenMap :: Token -> Map.Map Id Token getTokenMap t = execState (doAnalysis f t) Map.empty where f t = modify (Map.insert (getId t) t) -- Is this token in a quoting free context? (i.e. would variable expansion split) -- True: Assignments, [[ .. ]], here docs, already in double quotes -- False: Regular words isStrictlyQuoteFree = isQuoteFreeNode True -- Like above, but also allow some cases where splitting may be desired. -- True: Like above + for loops -- False: Like above isQuoteFree = isQuoteFreeNode False isQuoteFreeNode strict tree t = (isQuoteFreeElement t == Just True) || head (mapMaybe isQuoteFreeContext (drop 1 $ getPath tree t) ++ [False]) where -- Is this node self-quoting in itself? isQuoteFreeElement t = case t of T_Assignment {} -> return True T_FdRedirect {} -> return True _ -> Nothing -- Are any subnodes inherently self-quoting? isQuoteFreeContext t = case t of TC_Nullary _ DoubleBracket _ -> return True TC_Unary _ DoubleBracket _ _ -> return True TC_Binary _ DoubleBracket _ _ _ -> return True TA_Sequence {} -> return True T_Arithmetic {} -> return True T_Assignment {} -> return True T_Redirecting {} -> return False T_DoubleQuoted _ _ -> return True T_DollarDoubleQuoted _ _ -> return True T_CaseExpression {} -> return True T_HereDoc {} -> return True T_DollarBraced {} -> return True -- When non-strict, pragmatically assume it's desirable to split here T_ForIn {} -> return (not strict) T_SelectIn {} -> return (not strict) _ -> Nothing -- Check if a token is a parameter to a certain command by name: -- Example: isParamTo (parentMap params) "sed" t isParamTo :: Map.Map Id Token -> String -> Token -> Bool isParamTo tree cmd = go where go x = case Map.lookup (getId x) tree of Nothing -> False Just parent -> check parent check t = case t of T_SingleQuoted _ _ -> go t T_DoubleQuoted _ _ -> go t T_NormalWord _ _ -> go t T_SimpleCommand {} -> isCommand t cmd T_Redirecting {} -> isCommand t cmd _ -> False -- Get the parent command (T_Redirecting) of a Token, if any. getClosestCommand :: Map.Map Id Token -> Token -> Maybe Token getClosestCommand tree t = findFirst findCommand $ getPath tree t where findCommand t = case t of T_Redirecting {} -> return True T_Script {} -> return False _ -> Nothing -- Like above, if koala_man knew Haskell when starting this project. getClosestCommandM t = do tree <- asks parentMap return $ getClosestCommand tree t -- Is the token used as a command name (the first word in a T_SimpleCommand)? usedAsCommandName tree token = go (getId token) (tail $ getPath tree token) where go currentId (T_NormalWord id [word]:rest) | currentId == getId word = go id rest go currentId (T_DoubleQuoted id [word]:rest) | currentId == getId word = go id rest go currentId (T_SimpleCommand _ _ (word:_):_) | currentId == getId word = True go _ _ = False -- A list of the element and all its parents up to the root node. getPath tree t = t : case Map.lookup (getId t) tree of Nothing -> [] Just parent -> getPath tree parent -- Version of the above taking the map from the current context -- Todo: give this the name "getPath" getPathM t = do map <- asks parentMap return $ getPath map t isParentOf tree parent child = elem (getId parent) . map getId $ getPath tree child parents params = getPath (parentMap params) -- Find the first match in a list where the predicate is Just True. -- Stops if it's Just False and ignores Nothing. findFirst :: (a -> Maybe Bool) -> [a] -> Maybe a findFirst p l = case l of [] -> Nothing (x:xs) -> case p x of Just True -> return x Just False -> Nothing Nothing -> findFirst p xs -- Check whether a word is entirely output from a single command tokenIsJustCommandOutput t = case t of T_NormalWord id [T_DollarExpansion _ cmds] -> check cmds T_NormalWord id [T_DoubleQuoted _ [T_DollarExpansion _ cmds]] -> check cmds T_NormalWord id [T_Backticked _ cmds] -> check cmds T_NormalWord id [T_DoubleQuoted _ [T_Backticked _ cmds]] -> check cmds _ -> False where check [x] = not $ isOnlyRedirection x check _ = False -- TODO: Replace this with a proper Control Flow Graph getVariableFlow params t = let (_, stack) = runState (doStackAnalysis startScope endScope t) [] in reverse stack where startScope t = let scopeType = leadType params t in do when (scopeType /= NoneScope) $ modify (StackScope scopeType:) when (assignFirst t) $ setWritten t endScope t = let scopeType = leadType params t in do setRead t unless (assignFirst t) $ setWritten t when (scopeType /= NoneScope) $ modify (StackScopeEnd:) assignFirst T_ForIn {} = True assignFirst T_SelectIn {} = True assignFirst (T_BatsTest {}) = True assignFirst _ = False setRead t = let read = getReferencedVariables (parentMap params) t in mapM_ (\v -> modify (Reference v:)) read setWritten t = let written = getModifiedVariables t in mapM_ (\v -> modify (Assignment v:)) written leadType params t = case t of T_DollarExpansion _ _ -> SubshellScope "$(..) expansion" T_Backticked _ _ -> SubshellScope "`..` expansion" T_Backgrounded _ _ -> SubshellScope "backgrounding &" T_Subshell _ _ -> SubshellScope "(..) group" T_BatsTest {} -> SubshellScope "@bats test" T_CoProcBody _ _ -> SubshellScope "coproc" T_Redirecting {} -> if fromMaybe False causesSubshell then SubshellScope "pipeline" else NoneScope _ -> NoneScope where parentPipeline = do parent <- Map.lookup (getId t) (parentMap params) case parent of T_Pipeline {} -> return parent _ -> Nothing causesSubshell = do (T_Pipeline _ _ list) <- parentPipeline if length list <= 1 then return False else if not $ hasLastpipe params then return True else return . not $ (getId . head $ reverse list) == getId t getModifiedVariables t = case t of T_SimpleCommand _ vars [] -> concatMap (\x -> case x of T_Assignment id _ name _ w -> [(x, x, name, dataTypeFrom DataString w)] _ -> [] ) vars c@T_SimpleCommand {} -> getModifiedVariableCommand c TA_Unary _ "++|" v@(TA_Variable _ name _) -> [(t, v, name, DataString $ SourceFrom [v])] TA_Unary _ "|++" v@(TA_Variable _ name _) -> [(t, v, name, DataString $ SourceFrom [v])] TA_Assignment _ op (TA_Variable _ name _) rhs -> maybeToList $ do guard $ op `elem` ["=", "*=", "/=", "%=", "+=", "-=", "<<=", ">>=", "&=", "^=", "|="] return (t, t, name, DataString $ SourceFrom [rhs]) T_BatsTest {} -> [ (t, t, "lines", DataArray SourceExternal), (t, t, "status", DataString SourceInteger), (t, t, "output", DataString SourceExternal) ] -- Count [[ -v foo ]] as an "assignment". -- This is to prevent [ -v foo ] being unassigned or unused. TC_Unary id _ "-v" token -> maybeToList $ do str <- fmap (takeWhile (/= '[')) $ -- Quoted index flip getLiteralStringExt token $ \x -> case x of T_Glob _ s -> return s -- Unquoted index _ -> Nothing guard . not . null $ str return (t, token, str, DataString SourceChecked) T_DollarBraced _ _ l -> maybeToList $ do let string = bracedString t let modifier = getBracedModifier string guard $ ":=" `isPrefixOf` modifier return (t, t, getBracedReference string, DataString $ SourceFrom [l]) t@(T_FdRedirect _ ('{':var) op) -> -- {foo}>&2 modifies foo [(t, t, takeWhile (/= '}') var, DataString SourceInteger) | not $ isClosingFileOp op] t@(T_CoProc _ name _) -> [(t, t, fromMaybe "COPROC" name, DataArray SourceInteger)] --Points to 'for' rather than variable T_ForIn id str [] _ -> [(t, t, str, DataString SourceExternal)] T_ForIn id str words _ -> [(t, t, str, DataString $ SourceFrom words)] T_SelectIn id str words _ -> [(t, t, str, DataString $ SourceFrom words)] _ -> [] isClosingFileOp op = case op of T_IoDuplicate _ (T_GREATAND _) "-" -> True T_IoDuplicate _ (T_LESSAND _) "-" -> True _ -> False -- Consider 'export/declare -x' a reference, since it makes the var available getReferencedVariableCommand base@(T_SimpleCommand _ _ (T_NormalWord _ (T_Literal _ x:_):rest)) = case x of "export" -> if "f" `elem` flags then [] else concatMap getReference rest "declare" -> if any (`elem` flags) ["x", "p"] && (not $ any (`elem` flags) ["f", "F"]) then concatMap getReference rest else [] "trap" -> case rest of head:_ -> map (\x -> (head, head, x)) $ getVariablesFromLiteralToken head _ -> [] _ -> [] where getReference t@(T_Assignment _ _ name _ value) = [(t, t, name)] getReference t@(T_NormalWord _ [T_Literal _ name]) | not ("-" `isPrefixOf` name) = [(t, t, name)] getReference _ = [] flags = map snd $ getAllFlags base getReferencedVariableCommand _ = [] -- The function returns a tuple consisting of four items describing an assignment. -- Given e.g. declare foo=bar -- ( -- BaseCommand :: Token, -- The command/structure assigning the variable, i.e. declare foo=bar -- AssignmentToken :: Token, -- The specific part that assigns this variable, i.e. foo=bar -- VariableName :: String, -- The variable name, i.e. foo -- VariableValue :: DataType -- A description of the value being assigned, i.e. "Literal string with value foo" -- ) getModifiedVariableCommand base@(T_SimpleCommand _ _ (T_NormalWord _ (T_Literal _ x:_):rest)) = filter (\(_,_,s,_) -> not ("-" `isPrefixOf` s)) $ case x of "read" -> let params = map getLiteral rest readArrayVars = getReadArrayVariables rest in catMaybes . (++ readArrayVars) . takeWhile isJust . reverse $ params "getopts" -> case rest of opts:var:_ -> maybeToList $ getLiteral var _ -> [] "let" -> concatMap letParamToLiteral rest "export" -> if "f" `elem` flags then [] else concatMap getModifierParamString rest "declare" -> if any (`elem` flags) ["F", "f", "p"] then [] else declaredVars "typeset" -> declaredVars "local" -> concatMap getModifierParamString rest "readonly" -> if any (`elem` flags) ["f", "p"] then [] else concatMap getModifierParamString rest "set" -> maybeToList $ do params <- getSetParams rest return (base, base, "@", DataString $ SourceFrom params) "printf" -> maybeToList $ getPrintfVariable rest "mapfile" -> maybeToList $ getMapfileArray base rest "readarray" -> maybeToList $ getMapfileArray base rest "DEFINE_boolean" -> maybeToList $ getFlagVariable rest "DEFINE_float" -> maybeToList $ getFlagVariable rest "DEFINE_integer" -> maybeToList $ getFlagVariable rest "DEFINE_string" -> maybeToList $ getFlagVariable rest _ -> [] where flags = map snd $ getAllFlags base stripEquals s = let rest = dropWhile (/= '=') s in if rest == "" then "" else tail rest stripEqualsFrom (T_NormalWord id1 (T_Literal id2 s:rs)) = T_NormalWord id1 (T_Literal id2 (stripEquals s):rs) stripEqualsFrom (T_NormalWord id1 [T_DoubleQuoted id2 [T_Literal id3 s]]) = T_NormalWord id1 [T_DoubleQuoted id2 [T_Literal id3 (stripEquals s)]] stripEqualsFrom t = t declaredVars = concatMap (getModifierParam defaultType) rest where defaultType = if any (`elem` flags) ["a", "A"] then DataArray else DataString getLiteralOfDataType t d = do s <- getLiteralString t when ("-" `isPrefixOf` s) $ fail "argument" return (base, t, s, d) getLiteral t = getLiteralOfDataType t (DataString SourceExternal) getLiteralArray t = getLiteralOfDataType t (DataArray SourceExternal) getModifierParamString = getModifierParam DataString getModifierParam def t@(T_Assignment _ _ name _ value) = [(base, t, name, dataTypeFrom def value)] getModifierParam def t@T_NormalWord {} = maybeToList $ do name <- getLiteralString t guard $ isVariableName name return (base, t, name, def SourceDeclaration) getModifierParam _ _ = [] letParamToLiteral token = if var == "" then [] else [(base, token, var, DataString $ SourceFrom [stripEqualsFrom token])] where var = takeWhile isVariableChar $ dropWhile (`elem` "+-") $ concat $ oversimplify token getSetParams (t:_:rest) | getLiteralString t == Just "-o" = getSetParams rest getSetParams (t:rest) = let s = getLiteralString t in case s of Just "--" -> return rest Just ('-':_) -> getSetParams rest _ -> return (t:fromMaybe [] (getSetParams rest)) getSetParams [] = Nothing getPrintfVariable list = f $ map (\x -> (x, getLiteralString x)) list where f ((_, Just "-v") : (t, Just var) : _) = return (base, t, varName, varType $ SourceFrom list) where (varName, varType) = case elemIndex '[' var of Just i -> (take i var, DataArray) Nothing -> (var, DataString) f (_:rest) = f rest f [] = fail "not found" -- mapfile has some curious syntax allowing flags plus 0..n variable names -- where only the first non-option one is used if any. Here we cheat and -- just get the last one, if it's a variable name. getMapfileArray base arguments = do lastArg <- listToMaybe (reverse arguments) name <- getLiteralString lastArg guard $ isVariableName name return (base, lastArg, name, DataArray SourceExternal) -- get all the array variables used in read, e.g. read -a arr getReadArrayVariables args = map (getLiteralArray . snd) (filter (isArrayFlag . fst) (zip args (tail args))) isArrayFlag x = fromMaybe False $ do str <- getLiteralString x return $ case str of '-':'-':_ -> False '-':str -> 'a' `elem` str _ -> False -- get the FLAGS_ variable created by a shflags DEFINE_ call getFlagVariable (n:v:_) = do name <- getLiteralString n return (base, n, "FLAGS_" ++ name, DataString $ SourceExternal) getFlagVariable _ = Nothing getModifiedVariableCommand _ = [] getIndexReferences s = fromMaybe [] $ do match <- matchRegex re s index <- match !!! 0 return $ matchAllStrings variableNameRegex index where re = mkRegex "(\\[.*\\])" prop_getOffsetReferences1 = getOffsetReferences ":bar" == ["bar"] prop_getOffsetReferences2 = getOffsetReferences ":bar:baz" == ["bar", "baz"] prop_getOffsetReferences3 = getOffsetReferences "[foo]:bar" == ["bar"] prop_getOffsetReferences4 = getOffsetReferences "[foo]:bar:baz" == ["bar", "baz"] getOffsetReferences mods = fromMaybe [] $ do -- if mods start with [, then drop until ] match <- matchRegex re mods offsets <- match !!! 1 return $ matchAllStrings variableNameRegex offsets where re = mkRegex "^(\\[.+\\])? *:([^-=?+].*)" getReferencedVariables parents t = case t of T_DollarBraced id _ l -> let str = bracedString t in (t, t, getBracedReference str) : map (\x -> (l, l, x)) ( getIndexReferences str ++ getOffsetReferences (getBracedModifier str)) TA_Variable id name _ -> if isArithmeticAssignment t then [] else [(t, t, name)] T_Assignment id mode str _ word -> [(t, t, str) | mode == Append] ++ specialReferences str t word TC_Unary id _ "-v" token -> getIfReference t token TC_Unary id _ "-R" token -> getIfReference t token TC_Binary id DoubleBracket op lhs rhs -> if isDereferencing op then concatMap (getIfReference t) [lhs, rhs] else [] T_BatsTest {} -> [ -- pretend @test references vars to avoid warnings (t, t, "lines"), (t, t, "status"), (t, t, "output") ] t@(T_FdRedirect _ ('{':var) op) -> -- {foo}>&- references and closes foo [(t, t, takeWhile (/= '}') var) | isClosingFileOp op] x -> getReferencedVariableCommand x where -- Try to reduce false positives for unused vars only referenced from evaluated vars specialReferences name base word = if name `elem` [ "PS1", "PS2", "PS3", "PS4", "PROMPT_COMMAND" ] then map (\x -> (base, base, x)) $ getVariablesFromLiteralToken word else [] literalizer t = case t of T_Glob _ s -> return s -- Also when parsed as globs _ -> Nothing getIfReference context token = maybeToList $ do str <- getLiteralStringExt literalizer token guard . not $ null str when (isDigit $ head str) $ fail "is a number" return (context, token, getBracedReference str) isDereferencing = (`elem` ["-eq", "-ne", "-lt", "-le", "-gt", "-ge"]) isArithmeticAssignment t = case getPath parents t of this: TA_Assignment _ "=" lhs _ :_ -> lhs == t _ -> False dataTypeFrom defaultType v = (case v of T_Array {} -> DataArray; _ -> defaultType) $ SourceFrom [v] --- Command specific checks -- Compare a command to a string: t `isCommand` "sed" (also matches /usr/bin/sed) isCommand token str = isCommandMatch token (\cmd -> cmd == str || ('/' : str) `isSuffixOf` cmd) -- Compare a command to a literal. Like above, but checks full path. isUnqualifiedCommand token str = isCommandMatch token (== str) isCommandMatch token matcher = fromMaybe False $ fmap matcher (getCommandName token) -- Does this regex look like it was intended as a glob? -- True: *foo* -- False: .*foo.* isConfusedGlobRegex :: String -> Bool isConfusedGlobRegex ('*':_) = True isConfusedGlobRegex [x,'*'] | x `notElem` "\\." = True isConfusedGlobRegex _ = False isVariableStartChar x = x == '_' || isAsciiLower x || isAsciiUpper x isVariableChar x = isVariableStartChar x || isDigit x variableNameRegex = mkRegex "[_a-zA-Z][_a-zA-Z0-9]*" prop_isVariableName1 = isVariableName "_fo123" prop_isVariableName2 = not $ isVariableName "4" prop_isVariableName3 = not $ isVariableName "test: " isVariableName (x:r) = isVariableStartChar x && all isVariableChar r isVariableName _ = False getVariablesFromLiteralToken token = getVariablesFromLiteral (fromJust $ getLiteralStringExt (const $ return " ") token) -- Try to get referenced variables from a literal string like "$foo" -- Ignores tons of cases like arithmetic evaluation and array indices. prop_getVariablesFromLiteral1 = getVariablesFromLiteral "$foo${bar//a/b}$BAZ" == ["foo", "bar", "BAZ"] getVariablesFromLiteral string = map (!! 0) $ matchAllSubgroups variableRegex string where variableRegex = mkRegex "\\$\\{?([A-Za-z0-9_]+)" -- Get the variable name from an expansion like ${var:-foo} prop_getBracedReference1 = getBracedReference "foo" == "foo" prop_getBracedReference2 = getBracedReference "#foo" == "foo" prop_getBracedReference3 = getBracedReference "#" == "#" prop_getBracedReference4 = getBracedReference "##" == "#" prop_getBracedReference5 = getBracedReference "#!" == "!" prop_getBracedReference6 = getBracedReference "!#" == "#" prop_getBracedReference7 = getBracedReference "!foo#?" == "foo" prop_getBracedReference8 = getBracedReference "foo-bar" == "foo" prop_getBracedReference9 = getBracedReference "foo:-bar" == "foo" prop_getBracedReference10= getBracedReference "foo: -1" == "foo" prop_getBracedReference11= getBracedReference "!os*" == "" prop_getBracedReference12= getBracedReference "!os?bar**" == "" prop_getBracedReference13= getBracedReference "foo[bar]" == "foo" getBracedReference s = fromMaybe s $ nameExpansion s `mplus` takeName noPrefix `mplus` getSpecial noPrefix `mplus` getSpecial s where noPrefix = dropPrefix s dropPrefix (c:rest) = if c `elem` "!#" then rest else c:rest dropPrefix "" = "" takeName s = do let name = takeWhile isVariableChar s guard . not $ null name return name getSpecial (c:_) = if c `elem` "*@#?-$!" then return [c] else fail "not special" getSpecial _ = fail "empty" nameExpansion ('!':rest) = do -- e.g. ${!foo*bar*} let suffix = dropWhile isVariableChar rest guard $ suffix /= rest -- e.g. ${!@} first <- suffix !!! 0 guard $ first `elem` "*?" return "" nameExpansion _ = Nothing prop_getBracedModifier1 = getBracedModifier "foo:bar:baz" == ":bar:baz" prop_getBracedModifier2 = getBracedModifier "!var:-foo" == ":-foo" prop_getBracedModifier3 = getBracedModifier "foo[bar]" == "[bar]" getBracedModifier s = fromMaybe "" . listToMaybe $ do let var = getBracedReference s a <- dropModifier s dropPrefix var a where dropPrefix [] t = return t dropPrefix (a:b) (c:d) | a == c = dropPrefix b d dropPrefix _ _ = [] dropModifier (c:rest) | c `elem` "#!" = [rest, c:rest] dropModifier x = [x] -- Useful generic functions. -- Run an action in a Maybe (or do nothing). -- Example: -- potentially $ do -- s <- getLiteralString cmd -- guard $ s `elem` ["--recursive", "-r"] -- return $ warn .. "Something something recursive" potentially :: Monad m => Maybe (m ()) -> m () potentially = fromMaybe (return ()) -- Get element 0 or a default. Like `head` but safe. headOrDefault _ (a:_) = a headOrDefault def _ = def --- Get element n of a list, or Nothing. Like `!!` but safe. (!!!) list i = case drop i list of [] -> Nothing (r:_) -> Just r -- Run a command if the shell is in the given list whenShell l c = do shell <- asks shellType when (shell `elem` l ) c filterByAnnotation asSpec params = filter (not . shouldIgnore) where token = asScript asSpec shouldIgnore note = any (shouldIgnoreFor (getCode note)) $ getPath parents (T_Bang $ tcId note) shouldIgnoreFor _ T_Include {} = not $ asCheckSourced asSpec shouldIgnoreFor code t = isAnnotationIgnoringCode code t parents = parentMap params getCode = cCode . tcComment shouldIgnoreCode params code t = any (isAnnotationIgnoringCode code) $ getPath (parentMap params) t -- Is this a ${#anything}, to get string length or array count? isCountingReference (T_DollarBraced id _ token) = case concat $ oversimplify token of '#':_ -> True _ -> False isCountingReference _ = False -- FIXME: doesn't handle ${a:+$var} vs ${a:+"$var"} isQuotedAlternativeReference t = case t of T_DollarBraced _ _ _ -> getBracedModifier (bracedString t) `matches` re _ -> False where re = mkRegex "(^|\\]):?\\+" -- getGnuOpts "erd:u:" will parse a SimpleCommand like -- read -re -d : -u 3 bar -- into -- Just [("r", -re), ("e", -re), ("d", :), ("u", 3), ("", bar)] -- where flags with arguments map to arguments, while others map to themselves. -- Any unrecognized flag will result in Nothing. getGnuOpts = getOpts getAllFlags getBsdOpts = getOpts getLeadingFlags getOpts :: (Token -> [(Token, String)]) -> String -> Token -> Maybe [(String, Token)] getOpts flagTokenizer string cmd = process flags where flags = flagTokenizer cmd flagList (c:':':rest) = ([c], True) : flagList rest flagList (c:rest) = ([c], False) : flagList rest flagList [] = [] flagMap = Map.fromList $ ("", False) : flagList string process [] = return [] process [(token, flag)] = do takesArg <- Map.lookup flag flagMap guard $ not takesArg return [(flag, token)] process ((token1, flag1):rest2@((token2, flag2):rest)) = do takesArg <- Map.lookup flag1 flagMap if takesArg then do guard $ flag2 == "" more <- process rest return $ (flag1, token2) : more else do more <- process rest2 return $ (flag1, token1) : more supportsArrays shell = shell == Bash || shell == Ksh -- Returns true if the shell is Bash or Ksh (sorry for the name, Ksh) isBashLike :: Parameters -> Bool isBashLike params = case shellType params of Bash -> True Ksh -> True Dash -> False Sh -> False return [] runTests = $( [| $(forAllProperties) (quickCheckWithResult (stdArgs { maxSuccess = 1 }) ) |]) ShellCheck-0.7.0/src/ShellCheck/Checker.hs0000644000000000000000000003162713517444075016430 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} module ShellCheck.Checker (checkScript, ShellCheck.Checker.runTests) where import ShellCheck.Interface import ShellCheck.Parser import ShellCheck.Analyzer import Data.Either import Data.Functor import Data.List import Data.Maybe import Data.Ord import Control.Monad.Identity import qualified Data.Map as Map import qualified System.IO import Prelude hiding (readFile) import Control.Monad import Test.QuickCheck.All tokenToPosition startMap t = fromMaybe fail $ do span <- Map.lookup (tcId t) startMap return $ newPositionedComment { pcStartPos = fst span, pcEndPos = snd span, pcComment = tcComment t, pcFix = tcFix t } where fail = error "Internal shellcheck error: id doesn't exist. Please report!" shellFromFilename filename = foldl mplus Nothing candidates where shellExtensions = [(".ksh", Ksh) ,(".bash", Bash) ,(".bats", Bash) ,(".dash", Dash)] -- The `.sh` is too generic to determine the shell: -- We fallback to Bash in this case and emit SC2148 if there is no shebang candidates = map (\(ext,sh) -> if ext `isSuffixOf` filename then Just sh else Nothing) shellExtensions checkScript :: Monad m => SystemInterface m -> CheckSpec -> m CheckResult checkScript sys spec = do results <- checkScript (csScript spec) return emptyCheckResult { crFilename = csFilename spec, crComments = results } where checkScript contents = do result <- parseScript sys newParseSpec { psFilename = csFilename spec, psScript = contents, psCheckSourced = csCheckSourced spec, psIgnoreRC = csIgnoreRC spec, psShellTypeOverride = csShellTypeOverride spec } let parseMessages = prComments result let tokenPositions = prTokenPositions result let analysisSpec root = as { asScript = root, asShellType = csShellTypeOverride spec, asFallbackShell = shellFromFilename $ csFilename spec, asCheckSourced = csCheckSourced spec, asExecutionMode = Executed, asTokenPositions = tokenPositions, asOptionalChecks = csOptionalChecks spec } where as = newAnalysisSpec root let analysisMessages = fromMaybe [] $ (arComments . analyzeScript . analysisSpec) <$> prRoot result let translator = tokenToPosition tokenPositions return . nub . sortMessages . filter shouldInclude $ (parseMessages ++ map translator analysisMessages) shouldInclude pc = severity <= csMinSeverity spec && case csIncludedWarnings spec of Nothing -> code `notElem` csExcludedWarnings spec Just includedWarnings -> code `elem` includedWarnings where code = cCode (pcComment pc) severity = cSeverity (pcComment pc) sortMessages = sortBy (comparing order) order pc = let pos = pcStartPos pc comment = pcComment pc in (posFile pos, posLine pos, posColumn pos, cSeverity comment, cCode comment, cMessage comment) getPosition = pcStartPos getErrors sys spec = sort . map getCode . crComments $ runIdentity (checkScript sys spec) where getCode = cCode . pcComment check = checkWithIncludes [] checkWithSpec includes = getErrors (mockedSystemInterface includes) checkWithIncludes includes src = checkWithSpec includes emptyCheckSpec { csScript = src, csExcludedWarnings = [2148] } checkRecursive includes src = checkWithSpec includes emptyCheckSpec { csScript = src, csExcludedWarnings = [2148], csCheckSourced = True } checkOptionIncludes includes src = checkWithSpec [] emptyCheckSpec { csScript = src, csIncludedWarnings = includes, csCheckSourced = True } checkWithRc rc = getErrors (mockRcFile rc $ mockedSystemInterface []) checkWithIncludesAndSourcePath includes mapper = getErrors (mockedSystemInterface includes) { siFindSource = mapper } prop_findsParseIssue = check "echo \"$12\"" == [1037] prop_commentDisablesParseIssue1 = null $ check "#shellcheck disable=SC1037\necho \"$12\"" prop_commentDisablesParseIssue2 = null $ check "#shellcheck disable=SC1037\n#lol\necho \"$12\"" prop_findsAnalysisIssue = check "echo $1" == [2086] prop_commentDisablesAnalysisIssue1 = null $ check "#shellcheck disable=SC2086\necho $1" prop_commentDisablesAnalysisIssue2 = null $ check "#shellcheck disable=SC2086\n#lol\necho $1" prop_optionDisablesIssue1 = null $ getErrors (mockedSystemInterface []) emptyCheckSpec { csScript = "echo $1", csExcludedWarnings = [2148, 2086] } prop_optionDisablesIssue2 = null $ getErrors (mockedSystemInterface []) emptyCheckSpec { csScript = "echo \"$10\"", csExcludedWarnings = [2148, 1037] } prop_wontParseBadShell = [1071] == check "#!/usr/bin/python\ntrue $1\n" prop_optionDisablesBadShebang = null $ getErrors (mockedSystemInterface []) emptyCheckSpec { csScript = "#!/usr/bin/python\ntrue\n", csShellTypeOverride = Just Sh } prop_annotationDisablesBadShebang = [] == check "#!/usr/bin/python\n# shellcheck shell=sh\ntrue\n" prop_canParseDevNull = [] == check "source /dev/null" prop_failsWhenNotSourcing = [1091, 2154] == check "source lol; echo \"$bar\"" prop_worksWhenSourcing = null $ checkWithIncludes [("lib", "bar=1")] "source lib; echo \"$bar\"" prop_worksWhenSourcingWithDashDash = null $ checkWithIncludes [("lib", "bar=1")] "source -- lib; echo \"$bar\"" prop_worksWhenDotting = null $ checkWithIncludes [("lib", "bar=1")] ". lib; echo \"$bar\"" -- FIXME: This should really be giving [1093], "recursively sourced" prop_noInfiniteSourcing = [] == checkWithIncludes [("lib", "source lib")] "source lib" prop_canSourceBadSyntax = [1094, 2086] == checkWithIncludes [("lib", "for f; do")] "source lib; echo $1" prop_cantSourceDynamic = [1090] == checkWithIncludes [("lib", "")] ". \"$1\"" prop_cantSourceDynamic2 = [1090] == checkWithIncludes [("lib", "")] "source ~/foo" prop_canSourceDynamicWhenRedirected = null $ checkWithIncludes [("lib", "")] "#shellcheck source=lib\n. \"$1\"" prop_recursiveAnalysis = [2086] == checkRecursive [("lib", "echo $1")] "source lib" prop_recursiveParsing = [1037] == checkRecursive [("lib", "echo \"$10\"")] "source lib" prop_nonRecursiveAnalysis = [] == checkWithIncludes [("lib", "echo $1")] "source lib" prop_nonRecursiveParsing = [] == checkWithIncludes [("lib", "echo \"$10\"")] "source lib" prop_sourceDirectiveDoesntFollowFile = null $ checkWithIncludes [("foo", "source bar"), ("bar", "baz=3")] "#shellcheck source=foo\n. \"$1\"; echo \"$baz\"" prop_filewideAnnotationBase = [2086] == check "#!/bin/sh\necho $1" prop_filewideAnnotation1 = null $ check "#!/bin/sh\n# shellcheck disable=2086\necho $1" prop_filewideAnnotation2 = null $ check "#!/bin/sh\n# shellcheck disable=2086\ntrue\necho $1" prop_filewideAnnotation3 = null $ check "#!/bin/sh\n#unrelated\n# shellcheck disable=2086\ntrue\necho $1" prop_filewideAnnotation4 = null $ check "#!/bin/sh\n# shellcheck disable=2086\n#unrelated\ntrue\necho $1" prop_filewideAnnotation5 = null $ check "#!/bin/sh\n\n\n\n#shellcheck disable=2086\ntrue\necho $1" prop_filewideAnnotation6 = null $ check "#shellcheck shell=sh\n#unrelated\n#shellcheck disable=2086\ntrue\necho $1" prop_filewideAnnotation7 = null $ check "#!/bin/sh\n# shellcheck disable=2086\n#unrelated\ntrue\necho $1" prop_filewideAnnotationBase2 = [2086, 2181] == check "true\n[ $? == 0 ] && echo $1" prop_filewideAnnotation8 = null $ check "# Disable $? warning\n#shellcheck disable=SC2181\n# Disable quoting warning\n#shellcheck disable=2086\ntrue\n[ $? == 0 ] && echo $1" prop_sourcePartOfOriginalScript = -- #1181: -x disabled posix warning for 'source' 2039 `elem` checkWithIncludes [("./saywhat.sh", "echo foo")] "#!/bin/sh\nsource ./saywhat.sh" prop_spinBug1413 = null $ check "fun() {\n# shellcheck disable=SC2188\n> /dev/null\n}\n" prop_deducesTypeFromExtension = null result where result = checkWithSpec [] emptyCheckSpec { csFilename = "file.ksh", csScript = "(( 3.14 ))" } prop_deducesTypeFromExtension2 = result == [2079] where result = checkWithSpec [] emptyCheckSpec { csFilename = "file.bash", csScript = "(( 3.14 ))" } prop_shExtensionDoesntMatter = result == [2148] where result = checkWithSpec [] emptyCheckSpec { csFilename = "file.sh", csScript = "echo 'hello world'" } prop_sourcedFileUsesOriginalShellExtension = result == [2079] where result = checkWithSpec [("file.ksh", "(( 3.14 ))")] emptyCheckSpec { csFilename = "file.bash", csScript = "source file.ksh", csCheckSourced = True } prop_canEnableOptionalsWithSpec = result == [2244] where result = checkWithSpec [] emptyCheckSpec { csFilename = "file.sh", csScript = "#!/bin/sh\n[ \"$1\" ]", csOptionalChecks = ["avoid-nullary-conditions"] } prop_optionIncludes1 = -- expect 2086, but not included, so nothing reported null $ checkOptionIncludes (Just [2080]) "#!/bin/sh\n var='a b'\n echo $var" prop_optionIncludes2 = -- expect 2086, included, so it is reported [2086] == checkOptionIncludes (Just [2086]) "#!/bin/sh\n var='a b'\n echo $var" prop_optionIncludes3 = -- expect 2086, no inclusions provided, so it is reported [2086] == checkOptionIncludes Nothing "#!/bin/sh\n var='a b'\n echo $var" prop_optionIncludes4 = -- expect 2086 & 2154, only 2154 included, so only that's reported [2154] == checkOptionIncludes (Just [2154]) "#!/bin/sh\n var='a b'\n echo $var\n echo $bar" prop_readsRcFile = result == [] where result = checkWithRc "disable=2086" emptyCheckSpec { csScript = "#!/bin/sh\necho $1", csIgnoreRC = False } prop_canUseNoRC = result == [2086] where result = checkWithRc "disable=2086" emptyCheckSpec { csScript = "#!/bin/sh\necho $1", csIgnoreRC = True } prop_NoRCWontLookAtFile = result == [2086] where result = checkWithRc (error "Fail") emptyCheckSpec { csScript = "#!/bin/sh\necho $1", csIgnoreRC = True } prop_brokenRcGetsWarning = result == [1134, 2086] where result = checkWithRc "rofl" emptyCheckSpec { csScript = "#!/bin/sh\necho $1", csIgnoreRC = False } prop_canEnableOptionalsWithRc = result == [2244] where result = checkWithRc "enable=avoid-nullary-conditions" emptyCheckSpec { csScript = "#!/bin/sh\n[ \"$1\" ]" } prop_sourcePathRedirectsName = result == [2086] where f "dir/myscript" _ "lib" = return "foo/lib" result = checkWithIncludesAndSourcePath [("foo/lib", "echo $1")] f emptyCheckSpec { csScript = "#!/bin/bash\nsource lib", csFilename = "dir/myscript", csCheckSourced = True } prop_sourcePathAddsAnnotation = result == [2086] where f "dir/myscript" ["mypath"] "lib" = return "foo/lib" result = checkWithIncludesAndSourcePath [("foo/lib", "echo $1")] f emptyCheckSpec { csScript = "#!/bin/bash\n# shellcheck source-path=mypath\nsource lib", csFilename = "dir/myscript", csCheckSourced = True } prop_sourcePathRedirectsDirective = result == [2086] where f "dir/myscript" _ "lib" = return "foo/lib" f _ _ _ = return "/dev/null" result = checkWithIncludesAndSourcePath [("foo/lib", "echo $1")] f emptyCheckSpec { csScript = "#!/bin/bash\n# shellcheck source=lib\nsource kittens", csFilename = "dir/myscript", csCheckSourced = True } return [] runTests = $quickCheckAll ShellCheck-0.7.0/src/ShellCheck/Data.hs0000644000000000000000000001304313517444075015725 0ustar0000000000000000module ShellCheck.Data where import ShellCheck.Interface import Data.Version (showVersion) import Paths_ShellCheck (version) shellcheckVersion = showVersion version internalVariables = [ -- Generic "", "_", "rest", "REST", -- Bash "BASH", "BASHOPTS", "BASHPID", "BASH_ALIASES", "BASH_ARGC", "BASH_ARGV", "BASH_CMDS", "BASH_COMMAND", "BASH_EXECUTION_STRING", "BASH_LINENO", "BASH_REMATCH", "BASH_SOURCE", "BASH_SUBSHELL", "BASH_VERSINFO", "BASH_VERSION", "COMP_CWORD", "COMP_KEY", "COMP_LINE", "COMP_POINT", "COMP_TYPE", "COMP_WORDBREAKS", "COMP_WORDS", "COPROC", "DIRSTACK", "EUID", "FUNCNAME", "GROUPS", "HISTCMD", "HOSTNAME", "HOSTTYPE", "LINENO", "MACHTYPE", "MAPFILE", "OLDPWD", "OPTARG", "OPTIND", "OSTYPE", "PIPESTATUS", "PPID", "PWD", "RANDOM", "READLINE_LINE", "READLINE_POINT", "REPLY", "SECONDS", "SHELLOPTS", "SHLVL", "UID", "BASH_ENV", "BASH_XTRACEFD", "CDPATH", "COLUMNS", "COMPREPLY", "EMACS", "ENV", "FCEDIT", "FIGNORE", "FUNCNEST", "GLOBIGNORE", "HISTCONTROL", "HISTFILE", "HISTFILESIZE", "HISTIGNORE", "HISTSIZE", "HISTTIMEFORMAT", "HOME", "HOSTFILE", "IFS", "IGNOREEOF", "INPUTRC", "LANG", "LC_ALL", "LC_COLLATE", "LC_CTYPE", "LC_MESSAGES", "LC_MONETARY", "LC_NUMERIC", "LC_TIME", "LINES", "MAIL", "MAILCHECK", "MAILPATH", "OPTERR", "PATH", "POSIXLY_CORRECT", "PROMPT_COMMAND", "PROMPT_DIRTRIM", "PS1", "PS2", "PS3", "PS4", "SHELL", "TIMEFORMAT", "TMOUT", "TMPDIR", "auto_resume", "histchars", "COPROC", -- Other "USER", "TZ", "TERM", "LOGNAME", "LD_LIBRARY_PATH", "LANGUAGE", "DISPLAY", "HOSTNAME", "KRB5CCNAME", "XAUTHORITY" -- Ksh , ".sh.version" -- shflags , "FLAGS_ARGC", "FLAGS_ARGV", "FLAGS_ERROR", "FLAGS_FALSE", "FLAGS_HELP", "FLAGS_PARENT", "FLAGS_RESERVED", "FLAGS_TRUE", "FLAGS_VERSION", "flags_error", "flags_return" ] specialVariablesWithoutSpaces = [ "$", "-", "?", "!", "#" ] variablesWithoutSpaces = specialVariablesWithoutSpaces ++ [ "BASHPID", "BASH_ARGC", "BASH_LINENO", "BASH_SUBSHELL", "EUID", "LINENO", "OPTIND", "PPID", "RANDOM", "SECONDS", "SHELLOPTS", "SHLVL", "UID", "COLUMNS", "HISTFILESIZE", "HISTSIZE", "LINES" -- shflags , "FLAGS_ERROR", "FLAGS_FALSE", "FLAGS_TRUE" ] specialVariables = specialVariablesWithoutSpaces ++ ["@", "*"] unbracedVariables = specialVariables ++ [ "0", "1", "2", "3", "4", "5", "6", "7", "8", "9" ] arrayVariables = [ "BASH_ALIASES", "BASH_ARGC", "BASH_ARGV", "BASH_CMDS", "BASH_LINENO", "BASH_REMATCH", "BASH_SOURCE", "BASH_VERSINFO", "COMP_WORDS", "COPROC", "DIRSTACK", "FUNCNAME", "GROUPS", "MAPFILE", "PIPESTATUS", "COMPREPLY" ] commonCommands = [ "admin", "alias", "ar", "asa", "at", "awk", "basename", "batch", "bc", "bg", "break", "c99", "cal", "cat", "cd", "cflow", "chgrp", "chmod", "chown", "cksum", "cmp", "colon", "comm", "command", "compress", "continue", "cp", "crontab", "csplit", "ctags", "cut", "cxref", "date", "dd", "delta", "df", "diff", "dirname", "dot", "du", "echo", "ed", "env", "eval", "ex", "exec", "exit", "expand", "export", "expr", "fc", "fg", "file", "find", "fold", "fort77", "fuser", "gencat", "get", "getconf", "getopts", "grep", "hash", "head", "iconv", "ipcrm", "ipcs", "jobs", "join", "kill", "lex", "link", "ln", "locale", "localedef", "logger", "logname", "lp", "ls", "m4", "mailx", "make", "man", "mesg", "mkdir", "mkfifo", "more", "mv", "newgrp", "nice", "nl", "nm", "nohup", "od", "paste", "patch", "pathchk", "pax", "pr", "printf", "prs", "ps", "pwd", "qalter", "qdel", "qhold", "qmove", "qmsg", "qrerun", "qrls", "qselect", "qsig", "qstat", "qsub", "read", "readonly", "renice", "return", "rm", "rmdel", "rmdir", "sact", "sccs", "sed", "set", "sh", "shift", "sleep", "sort", "split", "strings", "strip", "stty", "tabs", "tail", "talk", "tee", "test", "time", "times", "touch", "tput", "tr", "trap", "tsort", "tty", "type", "ulimit", "umask", "unalias", "uname", "uncompress", "unexpand", "unget", "uniq", "unlink", "unset", "uucp", "uudecode", "uuencode", "uustat", "uux", "val", "vi", "wait", "wc", "what", "who", "write", "xargs", "yacc", "zcat" ] nonReadingCommands = [ "alias", "basename", "bg", "cal", "cd", "chgrp", "chmod", "chown", "cp", "du", "echo", "export", "false", "fg", "fuser", "getconf", "getopt", "getopts", "ipcrm", "ipcs", "jobs", "kill", "ln", "ls", "locale", "mv", "printf", "ps", "pwd", "renice", "rm", "rmdir", "set", "sleep", "touch", "trap", "true", "ulimit", "unalias", "uname" ] sampleWords = [ "alpha", "bravo", "charlie", "delta", "echo", "foxtrot", "golf", "hotel", "india", "juliett", "kilo", "lima", "mike", "november", "oscar", "papa", "quebec", "romeo", "sierra", "tango", "uniform", "victor", "whiskey", "xray", "yankee", "zulu" ] binaryTestOps = [ "-nt", "-ot", "-ef", "==", "!=", "<=", ">=", "-eq", "-ne", "-lt", "-le", "-gt", "-ge", "=~", ">", "<", "=", "\\<", "\\>", "\\<=", "\\>=" ] unaryTestOps = [ "!", "-a", "-b", "-c", "-d", "-e", "-f", "-g", "-h", "-L", "-k", "-p", "-r", "-s", "-S", "-t", "-u", "-w", "-x", "-O", "-G", "-N", "-z", "-n", "-o", "-v", "-R" ] shellForExecutable :: String -> Maybe Shell shellForExecutable name = case name of "sh" -> return Sh "bash" -> return Bash "bats" -> return Bash "dash" -> return Dash "ash" -> return Dash -- There's also a warning for this. "ksh" -> return Ksh "ksh88" -> return Ksh "ksh93" -> return Ksh otherwise -> Nothing ShellCheck-0.7.0/src/ShellCheck/Fixer.hs0000644000000000000000000003203713517444075016135 0ustar0000000000000000{- Copyright 2018-2019 Vidar Holen, Ng Zhi An This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} module ShellCheck.Fixer (applyFix, removeTabStops, mapPositions, Ranged(..), runTests) where import ShellCheck.Interface import Control.Monad.State import Data.Array import Data.List import Data.Semigroup import GHC.Exts (sortWith) import Test.QuickCheck -- The Ranged class is used for types that has a start and end position. class Ranged a where start :: a -> Position end :: a -> Position overlap :: a -> a -> Bool overlap x y = (yStart >= xStart && yStart < xEnd) || (yStart < xStart && yEnd > xStart) where yStart = start y yEnd = end y xStart = start x xEnd = end x -- Set a new start and end position on a Ranged setRange :: (Position, Position) -> a -> a -- Tests auto-verify that overlap commutes assertOverlap x y = overlap x y && overlap y x assertNoOverlap x y = not (overlap x y) && not (overlap y x) prop_overlap_contiguous = assertNoOverlap (tFromStart 10 12 "foo" 1) (tFromStart 12 14 "bar" 2) prop_overlap_adjacent_zerowidth = assertNoOverlap (tFromStart 3 3 "foo" 1) (tFromStart 3 3 "bar" 2) prop_overlap_enclosed = assertOverlap (tFromStart 3 5 "foo" 1) (tFromStart 1 10 "bar" 2) prop_overlap_partial = assertOverlap (tFromStart 1 5 "foo" 1) (tFromStart 3 7 "bar" 2) instance Ranged PositionedComment where start = pcStartPos end = pcEndPos setRange (s, e) pc = pc { pcStartPos = s, pcEndPos = e } instance Ranged Replacement where start = repStartPos end = repEndPos setRange (s, e) r = r { repStartPos = s, repEndPos = e } -- The Monoid instance for Fix merges fixes that do not conflict. -- TODO: Make an efficient 'mconcat' instance Monoid Fix where mempty = newFix mappend = (<>) instance Semigroup Fix where f1 <> f2 = -- FIXME: This might need to also discard adjacent zero-width ranges for -- when two fixes change the same AST node, e.g. `foo` -> "$(foo)" if or [ r2 `overlap` r1 | r1 <- fixReplacements f1, r2 <- fixReplacements f2 ] then f1 else newFix { fixReplacements = fixReplacements f1 ++ fixReplacements f2 } -- Conveniently apply a transformation to positions in a Fix mapPositions :: (Position -> Position) -> Fix -> Fix mapPositions f = adjustFix where adjustReplacement rep = rep { repStartPos = f $ repStartPos rep, repEndPos = f $ repEndPos rep } adjustFix fix = fix { fixReplacements = map adjustReplacement $ fixReplacements fix } -- Rewrite a Ranged from a tabstop of 8 to 1 removeTabStops :: Ranged a => a -> Array Int String -> a removeTabStops range ls = let startColumn = realignColumn lineNo colNo range endColumn = realignColumn endLineNo endColNo range startPosition = (start range) { posColumn = startColumn } endPosition = (end range) { posColumn = endColumn } in setRange (startPosition, endPosition) range where realignColumn lineNo colNo c = if lineNo c > 0 && lineNo c <= fromIntegral (length ls) then real (ls ! fromIntegral (lineNo c)) 0 0 (colNo c) else colNo c real _ r v target | target <= v = r -- hit this case at the end of line, and if we don't hit the target -- return real + (target - v) real [] r v target = r + (target - v) real ('\t':rest) r v target = real rest (r+1) (v + 8 - (v `mod` 8)) target real (_:rest) r v target = real rest (r+1) (v+1) target lineNo = posLine . start endLineNo = posLine . end colNo = posColumn . start endColNo = posColumn . end -- A replacement that spans multiple line is applied by: -- 1. merging the affected lines into a single string using `unlines` -- 2. apply the replacement as if it only spanned a single line -- The tricky part is adjusting the end column of the replacement -- (the end line doesn't matter because there is only one line) -- -- aaS <--- start of replacement (row 1 column 3) -- bbbb -- cEc -- \------- end of replacement (row 3 column 2) -- -- a flattened string will look like: -- -- "aaS\nbbbb\ncEc\n" -- -- The column of E has to be adjusted by: -- 1. lengths of lines to be replaced, except the end row itself -- 2. end column of the replacement -- 3. number of '\n' by `unlines` multiToSingleLine :: [Fix] -> Array Int String -> ([Fix], String) multiToSingleLine fixes lines = (map (mapPositions adjust) fixes, unlines $ elems lines) where -- A prefix sum tree from line number to column shift. -- FIXME: The tree will be totally unbalanced. shiftTree :: PSTree Int shiftTree = foldl (\t (n,s) -> addPSValue (n+1) (length s + 1) t) newPSTree $ assocs lines singleString = unlines $ elems lines adjust pos = pos { posLine = 1, posColumn = (posColumn pos) + (fromIntegral $ getPrefixSum (fromIntegral $ posLine pos) shiftTree) } -- Apply a fix and return resulting lines. -- The number of lines can increase or decrease with no obvious mapping back, so -- the function does not return an array. applyFix :: Fix -> Array Int String -> [String] applyFix fix fileLines = let untabbed = fix { fixReplacements = map (\c -> removeTabStops c fileLines) $ fixReplacements fix } (adjustedFixes, singleLine) = multiToSingleLine [untabbed] fileLines in lines . runFixer $ applyFixes2 adjustedFixes singleLine -- start and end comes from pos, which is 1 based prop_doReplace1 = doReplace 0 0 "1234" "A" == "A1234" -- technically not valid prop_doReplace2 = doReplace 1 1 "1234" "A" == "A1234" prop_doReplace3 = doReplace 1 2 "1234" "A" == "A234" prop_doReplace4 = doReplace 3 3 "1234" "A" == "12A34" prop_doReplace5 = doReplace 4 4 "1234" "A" == "123A4" prop_doReplace6 = doReplace 5 5 "1234" "A" == "1234A" doReplace start end o r = let si = fromIntegral (start-1) ei = fromIntegral (end-1) (x, xs) = splitAt si o (y, z) = splitAt (ei - si) xs in x ++ r ++ z -- Fail if the 'expected' string is not result when applying 'fixes' to 'original'. testFixes :: String -> String -> [Fix] -> Bool testFixes expected original fixes = actual == expected where actual = runFixer (applyFixes2 fixes original) -- A Fixer allows doing repeated modifications of a string where each -- replacement automatically accounts for shifts from previous ones. type Fixer a = State (PSTree Int) a -- Apply a single replacement using its indices into the original string. -- It does not handle multiple lines, all line indices must be 1. applyReplacement2 :: Replacement -> String -> Fixer String applyReplacement2 rep string = do tree <- get let transform pos = pos + getPrefixSum pos tree let originalPos = (repStartPos rep, repEndPos rep) (oldStart, oldEnd) = tmap (fromInteger . posColumn) originalPos (newStart, newEnd) = tmap transform (oldStart, oldEnd) let (l1, l2) = tmap posLine originalPos in when (l1 /= 1 || l2 /= 1) $ error "ShellCheck internal error, please report: bad cross-line fix" let replacer = repString rep let shift = (length replacer) - (oldEnd - oldStart) let insertionPoint = case repInsertionPoint rep of InsertBefore -> oldStart InsertAfter -> oldEnd+1 put $ addPSValue insertionPoint shift tree return $ doReplace newStart newEnd string replacer where tmap f (a,b) = (f a, f b) -- Apply a list of Replacements in the correct order applyReplacements2 :: [Replacement] -> String -> Fixer String applyReplacements2 reps str = foldM (flip applyReplacement2) str $ reverse $ sortWith repPrecedence reps -- Apply all fixes with replacements in the correct order applyFixes2 :: [Fix] -> String -> Fixer String applyFixes2 fixes = applyReplacements2 (concatMap fixReplacements fixes) -- Get the final value of a Fixer. runFixer :: Fixer a -> a runFixer f = evalState f newPSTree -- A Prefix Sum Tree that lets you look up the sum of values at and below an index. -- It's implemented essentially as a Fenwick tree without the bit-based balancing. -- The last Num is the sum of the left branch plus current element. data PSTree n = PSBranch n (PSTree n) (PSTree n) n | PSLeaf deriving (Show) newPSTree :: Num n => PSTree n newPSTree = PSLeaf -- Get the sum of values whose keys are <= 'target' getPrefixSum :: (Ord n, Num n) => n -> PSTree n -> n getPrefixSum = f 0 where f sum _ PSLeaf = sum f sum target (PSBranch pivot left right cumulative) = case () of _ | target < pivot -> f sum target left _ | target > pivot -> f (sum+cumulative) target right _ -> sum+cumulative -- Add a value to the Prefix Sum tree at the given index. -- Values accumulate: addPSValue 42 2 . addPSValue 42 3 == addPSValue 42 5 addPSValue :: (Ord n, Num n) => n -> n -> PSTree n -> PSTree n addPSValue key value tree = if value == 0 then tree else f tree where f PSLeaf = PSBranch key PSLeaf PSLeaf value f (PSBranch pivot left right sum) = case () of _ | key < pivot -> PSBranch pivot (f left) right (sum + value) _ | key > pivot -> PSBranch pivot left (f right) sum _ -> PSBranch pivot left right (sum + value) prop_pstreeSumsCorrectly kvs targets = let -- Trivial O(n * m) implementation dumbPrefixSums :: [(Int, Int)] -> [Int] -> [Int] dumbPrefixSums kvs targets = let prefixSum target = sum . map snd . filter (\(k,v) -> k <= target) $ kvs in map prefixSum targets -- PSTree O(n * log m) implementation smartPrefixSums :: [(Int, Int)] -> [Int] -> [Int] smartPrefixSums kvs targets = let tree = foldl (\tree (pos, shift) -> addPSValue pos shift tree) PSLeaf kvs in map (\x -> getPrefixSum x tree) targets in smartPrefixSums kvs targets == dumbPrefixSums kvs targets -- Semi-convenient functions for constructing tests. testFix :: [Replacement] -> Fix testFix list = newFix { fixReplacements = list } tFromStart :: Int -> Int -> String -> Int -> Replacement tFromStart start end repl order = newReplacement { repStartPos = newPosition { posLine = 1, posColumn = fromIntegral start }, repEndPos = newPosition { posLine = 1, posColumn = fromIntegral end }, repString = repl, repPrecedence = order, repInsertionPoint = InsertAfter } tFromEnd start end repl order = (tFromStart start end repl order) { repInsertionPoint = InsertBefore } prop_simpleFix1 = testFixes "hello world" "hell world" [ testFix [ tFromEnd 5 5 "o" 1 ]] prop_anchorsLeft = testFixes "-->foobar<--" "--><--" [ testFix [ tFromStart 4 4 "foo" 1, tFromStart 4 4 "bar" 2 ]] prop_anchorsRight = testFixes "-->foobar<--" "--><--" [ testFix [ tFromEnd 4 4 "bar" 1, tFromEnd 4 4 "foo" 2 ]] prop_anchorsBoth1 = testFixes "-->foobar<--" "--><--" [ testFix [ tFromStart 4 4 "bar" 2, tFromEnd 4 4 "foo" 1 ]] prop_anchorsBoth2 = testFixes "-->foobar<--" "--><--" [ testFix [ tFromEnd 4 4 "foo" 2, tFromStart 4 4 "bar" 1 ]] prop_composeFixes1 = testFixes "cd \"$1\" || exit" "cd $1" [ testFix [ tFromStart 4 4 "\"" 10, tFromEnd 6 6 "\"" 10 ], testFix [ tFromEnd 6 6 " || exit" 5 ]] prop_composeFixes2 = testFixes "$(\"$1\")" "`$1`" [ testFix [ tFromStart 1 2 "$(" 5, tFromEnd 4 5 ")" 5 ], testFix [ tFromStart 2 2 "\"" 10, tFromEnd 4 4 "\"" 10 ]] prop_composeFixes3 = testFixes "(x)[x]" "xx" [ testFix [ tFromStart 1 1 "(" 4, tFromEnd 2 2 ")" 3, tFromStart 2 2 "[" 2, tFromEnd 3 3 "]" 1 ]] prop_composeFixes4 = testFixes "(x)[x]" "xx" [ testFix [ tFromStart 1 1 "(" 4, tFromStart 2 2 "[" 3, tFromEnd 2 2 ")" 2, tFromEnd 3 3 "]" 1 ]] prop_composeFixes5 = testFixes "\"$(x)\"" "`x`" [ testFix [ tFromStart 1 2 "$(" 2, tFromEnd 3 4 ")" 2, tFromStart 1 1 "\"" 1, tFromEnd 4 4 "\"" 1 ]] return [] runTests = $quickCheckAll ShellCheck-0.7.0/src/ShellCheck/Interface.hs0000644000000000000000000002150513517444075016756 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE DeriveGeneric, DeriveAnyClass #-} module ShellCheck.Interface ( SystemInterface(..) , CheckSpec(csFilename, csScript, csCheckSourced, csIncludedWarnings, csExcludedWarnings, csShellTypeOverride, csMinSeverity, csIgnoreRC, csOptionalChecks) , CheckResult(crFilename, crComments) , ParseSpec(psFilename, psScript, psCheckSourced, psIgnoreRC, psShellTypeOverride) , ParseResult(prComments, prTokenPositions, prRoot) , AnalysisSpec(asScript, asShellType, asFallbackShell, asExecutionMode, asCheckSourced, asTokenPositions, asOptionalChecks) , AnalysisResult(arComments) , FormatterOptions(foColorOption, foWikiLinkCount) , Shell(Ksh, Sh, Bash, Dash) , ExecutionMode(Executed, Sourced) , ErrorMessage , Code , Severity(ErrorC, WarningC, InfoC, StyleC) , Position(posFile, posLine, posColumn) , Comment(cSeverity, cCode, cMessage) , PositionedComment(pcStartPos , pcEndPos , pcComment, pcFix) , ColorOption(ColorAuto, ColorAlways, ColorNever) , TokenComment(tcId, tcComment, tcFix) , emptyCheckResult , newParseResult , newAnalysisSpec , newAnalysisResult , newFormatterOptions , newPosition , newTokenComment , mockedSystemInterface , mockRcFile , newParseSpec , emptyCheckSpec , newPositionedComment , newComment , Fix(fixReplacements) , newFix , InsertionPoint(InsertBefore, InsertAfter) , Replacement(repStartPos, repEndPos, repString, repPrecedence, repInsertionPoint) , newReplacement , CheckDescription(cdName, cdDescription, cdPositive, cdNegative) , newCheckDescription ) where import ShellCheck.AST import Control.DeepSeq import Control.Monad.Identity import Data.List import Data.Monoid import Data.Ord import Data.Semigroup import GHC.Generics (Generic) import qualified Data.Map as Map data SystemInterface m = SystemInterface { -- Read a file by filename, or return an error siReadFile :: String -> m (Either ErrorMessage String), -- Given: -- the current script, -- a list of source-path annotations in effect, -- and a sourced file, -- find the sourced file siFindSource :: String -> [String] -> String -> m FilePath, -- Get the configuration file (name, contents) for a filename siGetConfig :: String -> m (Maybe (FilePath, String)) } -- ShellCheck input and output data CheckSpec = CheckSpec { csFilename :: String, csScript :: String, csCheckSourced :: Bool, csIgnoreRC :: Bool, csExcludedWarnings :: [Integer], csIncludedWarnings :: Maybe [Integer], csShellTypeOverride :: Maybe Shell, csMinSeverity :: Severity, csOptionalChecks :: [String] } deriving (Show, Eq) data CheckResult = CheckResult { crFilename :: String, crComments :: [PositionedComment] } deriving (Show, Eq) emptyCheckResult :: CheckResult emptyCheckResult = CheckResult { crFilename = "", crComments = [] } emptyCheckSpec :: CheckSpec emptyCheckSpec = CheckSpec { csFilename = "", csScript = "", csCheckSourced = False, csIgnoreRC = False, csExcludedWarnings = [], csIncludedWarnings = Nothing, csShellTypeOverride = Nothing, csMinSeverity = StyleC, csOptionalChecks = [] } newParseSpec :: ParseSpec newParseSpec = ParseSpec { psFilename = "", psScript = "", psCheckSourced = False, psIgnoreRC = False, psShellTypeOverride = Nothing } -- Parser input and output data ParseSpec = ParseSpec { psFilename :: String, psScript :: String, psCheckSourced :: Bool, psIgnoreRC :: Bool, psShellTypeOverride :: Maybe Shell } deriving (Show, Eq) data ParseResult = ParseResult { prComments :: [PositionedComment], prTokenPositions :: Map.Map Id (Position, Position), prRoot :: Maybe Token } deriving (Show, Eq) newParseResult :: ParseResult newParseResult = ParseResult { prComments = [], prTokenPositions = Map.empty, prRoot = Nothing } -- Analyzer input and output data AnalysisSpec = AnalysisSpec { asScript :: Token, asShellType :: Maybe Shell, asFallbackShell :: Maybe Shell, asExecutionMode :: ExecutionMode, asCheckSourced :: Bool, asOptionalChecks :: [String], asTokenPositions :: Map.Map Id (Position, Position) } newAnalysisSpec token = AnalysisSpec { asScript = token, asShellType = Nothing, asFallbackShell = Nothing, asExecutionMode = Executed, asCheckSourced = False, asOptionalChecks = [], asTokenPositions = Map.empty } newtype AnalysisResult = AnalysisResult { arComments :: [TokenComment] } newAnalysisResult = AnalysisResult { arComments = [] } -- Formatter options data FormatterOptions = FormatterOptions { foColorOption :: ColorOption, foWikiLinkCount :: Integer } newFormatterOptions = FormatterOptions { foColorOption = ColorAuto, foWikiLinkCount = 3 } data CheckDescription = CheckDescription { cdName :: String, cdDescription :: String, cdPositive :: String, cdNegative :: String } newCheckDescription = CheckDescription { cdName = "", cdDescription = "", cdPositive = "", cdNegative = "" } -- Supporting data types data Shell = Ksh | Sh | Bash | Dash deriving (Show, Eq) data ExecutionMode = Executed | Sourced deriving (Show, Eq) type ErrorMessage = String type Code = Integer data Severity = ErrorC | WarningC | InfoC | StyleC deriving (Show, Eq, Ord, Generic, NFData) data Position = Position { posFile :: String, -- Filename posLine :: Integer, -- 1 based source line posColumn :: Integer -- 1 based source column, where tabs are 8 } deriving (Show, Eq, Generic, NFData, Ord) newPosition :: Position newPosition = Position { posFile = "", posLine = 1, posColumn = 1 } data Comment = Comment { cSeverity :: Severity, cCode :: Code, cMessage :: String } deriving (Show, Eq, Generic, NFData) newComment :: Comment newComment = Comment { cSeverity = StyleC, cCode = 0, cMessage = "" } -- only support single line for now data Replacement = Replacement { repStartPos :: Position, repEndPos :: Position, repString :: String, -- Order in which the replacements should happen: highest precedence first. repPrecedence :: Int, -- Whether to insert immediately before or immediately after the specified region. repInsertionPoint :: InsertionPoint } deriving (Show, Eq, Generic, NFData) data InsertionPoint = InsertBefore | InsertAfter deriving (Show, Eq, Generic, NFData) instance Ord Replacement where compare r1 r2 = (repStartPos r1) `compare` (repStartPos r2) newReplacement = Replacement { repStartPos = newPosition, repEndPos = newPosition, repString = "", repPrecedence = 1, repInsertionPoint = InsertAfter } data Fix = Fix { fixReplacements :: [Replacement] } deriving (Show, Eq, Generic, NFData) newFix = Fix { fixReplacements = [] } data PositionedComment = PositionedComment { pcStartPos :: Position, pcEndPos :: Position, pcComment :: Comment, pcFix :: Maybe Fix } deriving (Show, Eq, Generic, NFData) newPositionedComment :: PositionedComment newPositionedComment = PositionedComment { pcStartPos = newPosition, pcEndPos = newPosition, pcComment = newComment, pcFix = Nothing } data TokenComment = TokenComment { tcId :: Id, tcComment :: Comment, tcFix :: Maybe Fix } deriving (Show, Eq, Generic, NFData) newTokenComment = TokenComment { tcId = Id 0, tcComment = newComment, tcFix = Nothing } data ColorOption = ColorAuto | ColorAlways | ColorNever deriving (Ord, Eq, Show) -- For testing mockedSystemInterface :: [(String, String)] -> SystemInterface Identity mockedSystemInterface files = SystemInterface { siReadFile = rf, siFindSource = fs, siGetConfig = const $ return Nothing } where rf file = case filter ((== file) . fst) files of [] -> return $ Left "File not included in mock." [(_, contents)] -> return $ Right contents fs _ _ file = return file mockRcFile rcfile mock = mock { siGetConfig = const . return $ Just (".shellcheckrc", rcfile) } ShellCheck-0.7.0/src/ShellCheck/Parser.hs0000644000000000000000000035735013517444075016324 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} {-# LANGUAGE NoMonomorphismRestriction #-} {-# LANGUAGE FlexibleContexts #-} {-# LANGUAGE MultiWayIf #-} module ShellCheck.Parser (parseScript, runTests) where import ShellCheck.AST import ShellCheck.ASTLib import ShellCheck.Data import ShellCheck.Interface import Control.Applicative ((<*), (*>)) import Control.Monad import Control.Monad.Identity import Control.Monad.Trans import Data.Char import Data.Functor import Data.List (isPrefixOf, isInfixOf, isSuffixOf, partition, sortBy, intercalate, nub) import Data.Maybe import Data.Monoid import Debug.Trace import GHC.Exts (sortWith) import Prelude hiding (readList) import System.IO import Text.Parsec hiding (runParser, ()) import Text.Parsec.Error import Text.Parsec.Pos import qualified Control.Monad.Reader as Mr import qualified Control.Monad.State as Ms import qualified Data.Map as Map import Test.QuickCheck.All (quickCheckAll) type SCBase m = Mr.ReaderT (Environment m) (Ms.StateT SystemState m) type SCParser m v = ParsecT String UserState (SCBase m) v backslash :: Monad m => SCParser m Char backslash = char '\\' linefeed :: Monad m => SCParser m Char linefeed = do optional carriageReturn c <- char '\n' readPendingHereDocs return c singleQuote = char '\'' doubleQuote = char '"' variableStart = upper <|> lower <|> oneOf "_" variableChars = upper <|> lower <|> digit <|> oneOf "_" -- Chars to allow in function names functionChars = variableChars <|> oneOf ":+?-./^@" -- Chars to allow in functions using the 'function' keyword extendedFunctionChars = functionChars <|> oneOf "[]*=!" specialVariable = oneOf (concat specialVariables) paramSubSpecialChars = oneOf "/:+-=%" quotableChars = "|&;<>()\\ '\t\n\r\xA0" ++ doubleQuotableChars quotable = almostSpace <|> oneOf quotableChars bracedQuotable = oneOf "}\"$`'" doubleQuotableChars = "\\\"$`" doubleQuotable = oneOf doubleQuotableChars whitespace = oneOf " \t" <|> carriageReturn <|> almostSpace <|> linefeed linewhitespace = oneOf " \t" <|> almostSpace suspectCharAfterQuotes = variableChars <|> char '%' extglobStartChars = "?*@!+" extglobStart = oneOf extglobStartChars unicodeDoubleQuotes = "\x201C\x201D\x2033\x2036" unicodeSingleQuotes = "\x2018\x2019" prop_spacing = isOk spacing " \\\n # Comment" spacing = do x <- many (many1 linewhitespace <|> try (string "\\\n" >> return "")) optional readComment return $ concat x spacing1 = do spacing <- spacing when (null spacing) $ fail "Expected whitespace" return spacing prop_allspacing = isOk allspacing "#foo" prop_allspacing2 = isOk allspacing " #foo\n # bar\n#baz\n" prop_allspacing3 = isOk allspacing "#foo\n#bar\n#baz\n" allspacing = do s <- spacing more <- option False (linefeed >> return True) if more then do rest <- allspacing return $ s ++ "\n" ++ rest else return s allspacingOrFail = do s <- allspacing when (null s) $ fail "Expected whitespace" return s readUnicodeQuote = do start <- startSpan c <- oneOf (unicodeSingleQuotes ++ unicodeDoubleQuotes) id <- endSpan start parseProblemAtId id WarningC 1110 "This is a unicode quote. Delete and retype it (or quote to make literal)." return $ T_Literal id [c] carriageReturn = do parseNote ErrorC 1017 "Literal carriage return. Run script through tr -d '\\r' ." char '\r' almostSpace = choice [ check '\xA0' "unicode non-breaking space", check '\x200B' "unicode zerowidth space" ] where check c name = do parseNote ErrorC 1018 $ "This is a " ++ name ++ ". Delete and retype it." char c return ' ' --------- Message/position annotation on top of user state data ParseNote = ParseNote SourcePos SourcePos Severity Code String deriving (Show, Eq) data Context = ContextName SourcePos String | ContextAnnotation [Annotation] | ContextSource String deriving (Show) data HereDocContext = HereDocPending Token [Context] -- on linefeed, read this T_HereDoc deriving (Show) data UserState = UserState { lastId :: Id, positionMap :: Map.Map Id (SourcePos, SourcePos), parseNotes :: [ParseNote], hereDocMap :: Map.Map Id [Token], pendingHereDocs :: [HereDocContext] } initialUserState = UserState { lastId = Id $ -1, positionMap = Map.empty, parseNotes = [], hereDocMap = Map.empty, pendingHereDocs = [] } codeForParseNote (ParseNote _ _ _ code _) = code getLastId = lastId <$> getState getNextIdBetween startPos endPos = do state <- getState let newId = incId (lastId state) let newMap = Map.insert newId (startPos, endPos) (positionMap state) putState $ state { lastId = newId, positionMap = newMap } return newId where incId (Id n) = Id $ n+1 getNextIdSpanningTokens startTok endTok = do (start, _) <- getSpanForId (getId startTok) (_, end) <- getSpanForId (getId endTok) getNextIdBetween start end -- Get an ID starting from the first token of the list, and ending after the last getNextIdSpanningTokenList list = if null list then do pos <- getPosition getNextIdBetween pos pos else getNextIdSpanningTokens (head list) (last list) -- Get the span covered by an id getSpanForId :: Monad m => Id -> SCParser m (SourcePos, SourcePos) getSpanForId id = Map.findWithDefault (error "Internal error: no position for id. Please report!") id <$> getMap -- Create a new id with the same span as an existing one getNewIdFor :: Monad m => Id -> SCParser m Id getNewIdFor id = getSpanForId id >>= uncurry getNextIdBetween data IncompleteInterval = IncompleteInterval SourcePos startSpan = IncompleteInterval <$> getPosition endSpan (IncompleteInterval start) = do endPos <- getPosition id <- getNextIdBetween start endPos return id addToHereDocMap id list = do state <- getState let map = hereDocMap state putState $ state { hereDocMap = Map.insert id list map } addPendingHereDoc t = do state <- getState context <- getCurrentContexts let docs = pendingHereDocs state putState $ state { pendingHereDocs = HereDocPending t context : docs } popPendingHereDocs = do state <- getState let pending = pendingHereDocs state putState $ state { pendingHereDocs = [] } return . reverse $ pendingHereDocs state getMap = positionMap <$> getState getParseNotes = parseNotes <$> getState addParseNote n = do irrelevant <- shouldIgnoreCode (codeForParseNote n) unless irrelevant $ do state <- getState putState $ state { parseNotes = n : parseNotes state } shouldIgnoreCode code = do context <- getCurrentContexts checkSourced <- Mr.asks checkSourced return $ any (disabling checkSourced) context where disabling checkSourced item = case item of ContextAnnotation list -> any disabling' list ContextSource _ -> not $ checkSourced _ -> False disabling' (DisableComment n) = code == n disabling' _ = False getCurrentAnnotations includeSource = concatMap get . takeWhile (not . isBoundary) <$> getCurrentContexts where get (ContextAnnotation list) = list get _ = [] isBoundary (ContextSource _) = not includeSource isBoundary _ = False shouldFollow file = do context <- getCurrentContexts if any isThisFile context then return False else if length (filter isSource context) >= 100 then do parseProblem ErrorC 1092 "Stopping at 100 'source' frames :O" return False else return True where isSource (ContextSource _) = True isSource _ = False isThisFile (ContextSource name) | name == file = True isThisFile _= False getSourceOverride = do context <- getCurrentContexts return . msum . map findFile $ takeWhile isSameFile context where isSameFile (ContextSource _) = False isSameFile _ = True findFile (ContextAnnotation list) = msum $ map getFile list findFile _ = Nothing getFile (SourceOverride str) = Just str getFile _ = Nothing -- Store potential parse problems outside of parsec data SystemState = SystemState { contextStack :: [Context], parseProblems :: [ParseNote] } initialSystemState = SystemState { contextStack = [], parseProblems = [] } data Environment m = Environment { systemInterface :: SystemInterface m, checkSourced :: Bool, ignoreRC :: Bool, currentFilename :: String, shellTypeOverride :: Maybe Shell } parseProblem level code msg = do pos <- getPosition parseProblemAt pos level code msg setCurrentContexts c = Ms.modify (\state -> state { contextStack = c }) getCurrentContexts = contextStack <$> Ms.get popContext = do v <- getCurrentContexts if not $ null v then do let (a:r) = v setCurrentContexts r return $ Just a else return Nothing pushContext c = do v <- getCurrentContexts setCurrentContexts (c:v) parseProblemAtWithEnd start end level code msg = do irrelevant <- shouldIgnoreCode code unless irrelevant $ addParseProblem note where note = ParseNote start end level code msg addParseProblem note = Ms.modify (\state -> state { parseProblems = note:parseProblems state }) parseProblemAt pos = parseProblemAtWithEnd pos pos parseProblemAtId :: Monad m => Id -> Severity -> Integer -> String -> SCParser m () parseProblemAtId id level code msg = do (start, end) <- getSpanForId id parseProblemAtWithEnd start end level code msg -- Store non-parse problems inside parseNote c l a = do pos <- getPosition parseNoteAt pos c l a parseNoteAt pos c l a = addParseNote $ ParseNote pos pos c l a parseNoteAtId id c l a = do (start, end) <- getSpanForId id addParseNote $ ParseNote start end c l a parseNoteAtWithEnd start end c l a = addParseNote $ ParseNote start end c l a --------- Convenient combinators thenSkip main follow = do r <- main optional follow return r unexpecting s p = try $ (try p >> fail ("Unexpected " ++ s)) <|> return () notFollowedBy2 = unexpecting "" reluctantlyTill p end = (lookAhead (void (try end) <|> eof) >> return []) <|> do x <- p more <- reluctantlyTill p end return $ x:more <|> return [] reluctantlyTill1 p end = do notFollowedBy2 end x <- p more <- reluctantlyTill p end return $ x:more attempting rest branch = (try branch >> rest) <|> rest orFail parser errorAction = try parser <|> (errorAction >>= fail) -- Construct a node with a parser, e.g. T_Literal `withParser` (readGenericLiteral ",") withParser node parser = do start <- startSpan contents <- parser id <- endSpan start return $ node id contents wasIncluded p = option False (p >> return True) acceptButWarn parser level code note = optional $ try (do pos <- getPosition parser parseProblemAt pos level code note ) parsecBracket before after op = do val <- before (op val <* optional (after val)) <|> (after val *> fail "") swapContext contexts p = parsecBracket (getCurrentContexts <* setCurrentContexts contexts) setCurrentContexts (const p) withContext entry p = parsecBracket (pushContext entry) (const popContext) (const p) called s p = do pos <- getPosition withContext (ContextName pos s) p withAnnotations anns = withContext (ContextAnnotation anns) readConditionContents single = readCondContents `attempting` lookAhead (do pos <- getPosition s <- readVariableName when (s `elem` commonCommands) $ parseProblemAt pos WarningC 1014 "Use 'if cmd; then ..' to check exit code, or 'if [[ $(cmd) == .. ]]' to check output.") where spacingOrLf = condSpacing True condSpacing required = do pos <- getPosition space <- allspacing when (required && null space) $ parseProblemAt pos ErrorC 1035 "You are missing a required space here." when (single && '\n' `elem` space) $ parseProblemAt pos ErrorC 1080 "When breaking lines in [ ], you need \\ before the linefeed." return space typ = if single then SingleBracket else DoubleBracket readCondBinaryOp = try $ do optional guardArithmetic op <- getOp spacingOrLf return op where flaglessOps = [ "==", "!=", "<=", ">=", "=~", ">", "<", "=" ] getOp = do start <- startSpan op <- readRegularOrEscaped anyOp id <- endSpan start return $ TC_Binary id typ op anyOp = flagOp <|> flaglessOp <|> fail "Expected comparison operator (don't wrap commands in []/[[]])" flagOp = try $ do s <- readOp when (s == "-a" || s == "-o") $ fail "Unexpected operator" return s flaglessOp = choice $ map (try . string) flaglessOps -- hacks to read quoted operators without having to read a shell word readEscaped p = try $ withEscape <|> withQuotes where withEscape = do char '\\' escaped <$> p withQuotes = do c <- oneOf "'\"" s <- p char c return $ escaped s escaped s = if any (`elem` s) "<>()" then '\\':s else s readRegularOrEscaped p = readEscaped p <|> p guardArithmetic = do try . lookAhead $ void (oneOf "+*/%") <|> void (string "- ") parseProblem ErrorC 1076 $ if single then "Trying to do math? Use e.g. [ $((i/2+7)) -ge 18 ]." else "Trying to do math? Use e.g. [[ $((i/2+7)) -ge 18 ]]." readCondUnaryExp = do op <- readCondUnaryOp pos <- getPosition liftM op readCondWord `orFail` do parseProblemAt pos ErrorC 1019 "Expected this to be an argument to the unary condition." return "Expected an argument for the unary operator" readCondUnaryOp = try $ do start <- startSpan s <- readOp id <- endSpan start spacingOrLf return $ TC_Unary id typ s readOp = try $ do char '-' <|> weirdDash s <- many1 letter <|> fail "Expected a test operator" return ('-':s) weirdDash = do pos <- getPosition oneOf "\x058A\x05BE\x2010\x2011\x2012\x2013\x2014\x2015\xFE63\xFF0D" parseProblemAt pos ErrorC 1100 "This is a unicode dash. Delete and retype as ASCII minus." return '-' readCondWord = do notFollowedBy2 (try (spacing >> string "]")) x <- readNormalWord pos <- getPosition when (endedWith "]" x && notArrayIndex x) $ do parseProblemAt pos ErrorC 1020 $ "You need a space before the " ++ (if single then "]" else "]]") ++ "." fail "Missing space before ]" when (single && endedWith ")" x) $ do parseProblemAt pos ErrorC 1021 "You need a space before the \\)" fail "Missing space before )" void spacing return x where endedWith str (T_NormalWord id s@(_:_)) = case last s of T_Literal id s -> str `isSuffixOf` s _ -> False endedWith _ _ = False notArrayIndex (T_NormalWord id s@(_:T_Literal _ t:_)) = t /= "[" notArrayIndex _ = True readCondAndOp = readAndOrOp TC_And "&&" False <|> readAndOrOp TC_And "-a" True readCondOrOp = do optional guardArithmetic readAndOrOp TC_Or "||" False <|> readAndOrOp TC_Or "-o" True readAndOrOp node op requiresSpacing = do optional $ lookAhead weirdDash start <- startSpan x <- try $ string op id <- endSpan start condSpacing requiresSpacing return $ node id typ x readCondNullaryOrBinary = do start <- startSpan x <- readCondWord `attempting` (do pos <- getPosition lookAhead (char '[') parseProblemAt pos ErrorC 1026 $ if single then "If grouping expressions inside [..], use \\( ..\\)." else "If grouping expressions inside [[..]], use ( .. )." ) id <- endSpan start (do pos <- getPosition isRegex <- regexOperatorAhead op <- readCondBinaryOp y <- if isRegex then readRegex else readCondWord <|> (parseProblemAt pos ErrorC 1027 "Expected another argument for this operator." >> mzero) return (x `op` y) ) <|> ( do checkTrailingOp x return $ TC_Nullary id typ x ) checkTrailingOp x = fromMaybe (return ()) $ do (T_Literal id str) <- getTrailingUnquotedLiteral x trailingOp <- listToMaybe (filter (`isSuffixOf` str) binaryTestOps) return $ parseProblemAtId id ErrorC 1108 $ "You need a space before and after the " ++ trailingOp ++ " ." readCondGroup = do start <- startSpan pos <- getPosition lparen <- try $ readRegularOrEscaped (string "(") when (single && lparen == "(") $ singleWarning pos when (not single && lparen == "\\(") $ doubleWarning pos condSpacing single x <- readCondContents cpos <- getPosition rparen <- readRegularOrEscaped (string ")") id <- endSpan start condSpacing single when (single && rparen == ")") $ singleWarning cpos when (not single && rparen == "\\)") $ doubleWarning cpos return $ TC_Group id typ x where singleWarning pos = parseProblemAt pos ErrorC 1028 "In [..] you have to escape \\( \\) or preferably combine [..] expressions." doubleWarning pos = parseProblemAt pos ErrorC 1029 "In [[..]] you shouldn't escape ( or )." -- Currently a bit of a hack since parsing rules are obscure regexOperatorAhead = lookAhead (do try (string "=~") <|> try (string "~=") return True) <|> return False readRegex = called "regex" $ do start <- startSpan parts <- many1 readPart id <- endSpan start void spacing return $ T_NormalWord id parts where readPart = choice [ readGroup, readSingleQuoted, readDoubleQuoted, readDollarExpression, readLiteralForParser $ readNormalLiteral "( ", readLiteralString "|", readGlobLiteral ] readGlobLiteral = do start <- startSpan s <- extglobStart <|> oneOf "{}[]$" id <- endSpan start return $ T_Literal id [s] readGroup = called "regex grouping" $ do start <- startSpan p1 <- readLiteralString "(" parts <- many (readPart <|> readRegexLiteral) p2 <- readLiteralString ")" id <- endSpan start return $ T_NormalWord id (p1:(parts ++ [p2])) readRegexLiteral = do start <- startSpan str <- readGenericLiteral1 (singleQuote <|> doubleQuotable <|> oneOf "()") id <- endSpan start return $ T_Literal id str readLiteralString s = do start <- startSpan str <- string s id <- endSpan start return $ T_Literal id str readCondTerm = do term <- readCondNot <|> readCondExpr condSpacing False return term readCondNot = do start <- startSpan char '!' id <- endSpan start spacingOrLf expr <- readCondExpr return $ TC_Unary id typ "!" expr readCondExpr = readCondGroup <|> readCondUnaryExp <|> readCondNullaryOrBinary readCondOr = chainl1 readCondAnd readCondAndOp readCondAnd = chainl1 readCondTerm readCondOrOp readCondContents = readCondOr prop_a1 = isOk readArithmeticContents " n++ + ++c" prop_a2 = isOk readArithmeticContents "$N*4-(3,2)" prop_a3 = isOk readArithmeticContents "n|=2<<1" prop_a4 = isOk readArithmeticContents "n &= 2 **3" prop_a5 = isOk readArithmeticContents "1 |= 4 && n >>= 4" prop_a6 = isOk readArithmeticContents " 1 | 2 ||3|4" prop_a7 = isOk readArithmeticContents "3*2**10" prop_a8 = isOk readArithmeticContents "3" prop_a9 = isOk readArithmeticContents "a^!-b" prop_a10= isOk readArithmeticContents "! $?" prop_a11= isOk readArithmeticContents "10#08 * 16#f" prop_a12= isOk readArithmeticContents "\"$((3+2))\" + '37'" prop_a13= isOk readArithmeticContents "foo[9*y+x]++" prop_a14= isOk readArithmeticContents "1+`echo 2`" prop_a15= isOk readArithmeticContents "foo[`echo foo | sed s/foo/4/g` * 3] + 4" prop_a16= isOk readArithmeticContents "$foo$bar" prop_a17= isOk readArithmeticContents "i<(0+(1+1))" prop_a18= isOk readArithmeticContents "a?b:c" prop_a19= isOk readArithmeticContents "\\\n3 +\\\n 2" prop_a20= isOk readArithmeticContents "a ? b ? c : d : e" prop_a21= isOk readArithmeticContents "a ? b : c ? d : e" prop_a22= isOk readArithmeticContents "!!a" prop_a23= isOk readArithmeticContents "~0" readArithmeticContents :: Monad m => SCParser m Token readArithmeticContents = readSequence where spacing = let lf = try (string "\\\n") >> return '\n' in many (whitespace <|> lf) splitBy x ops = chainl1 x (readBinary ops) readBinary ops = readComboOp ops TA_Binary readComboOp op token = do start <- startSpan op <- choice (map (\x -> try $ do s <- string x failIfIncompleteOp return s ) op) id <- endSpan start spacing return $ token id op failIfIncompleteOp = notFollowedBy2 $ oneOf "&|<>=" -- Read binary minus, but also check for -lt, -gt and friends: readMinusOp = do start <- startSpan pos <- getPosition try $ do char '-' failIfIncompleteOp optional $ do (str, alt) <- lookAhead . choice $ map tryOp [ ("lt", "<"), ("gt", ">"), ("le", "<="), ("ge", ">="), ("eq", "=="), ("ne", "!=") ] parseProblemAt pos ErrorC 1106 $ "In arithmetic contexts, use " ++ alt ++ " instead of -" ++ str id <- endSpan start spacing return $ TA_Binary id "-" where tryOp (str, alt) = try $ do string str spacing1 return (str, alt) readArrayIndex = do start <- startSpan char '[' pos <- getPosition middle <- readStringForParser readArithmeticContents char ']' id <- endSpan start return $ T_UnparsedIndex id pos middle literal s = do start <- startSpan string s id <- endSpan start return $ T_Literal id s readVariable = do start <- startSpan name <- readVariableName indices <- many readArrayIndex id <- endSpan start spacing return $ TA_Variable id name indices readExpansion = do start <- startSpan pieces <- many1 $ choice [ readSingleQuoted, readDoubleQuoted, readNormalDollar, readBraced, readUnquotedBackTicked, literal "#", readNormalLiteral "+-*/=%^,]?:" ] id <- endSpan start spacing return $ TA_Expansion id pieces readGroup = do char '(' s <- readSequence char ')' spacing return s readArithTerm = readGroup <|> readVariable <|> readExpansion readSequence = do spacing start <- startSpan l <- readAssignment `sepBy` (char ',' >> spacing) id <- endSpan start return $ TA_Sequence id l readAssignment = chainr1 readTrinary readAssignmentOp readAssignmentOp = readComboOp ["=", "*=", "/=", "%=", "+=", "-=", "<<=", ">>=", "&=", "^=", "|="] TA_Assignment readTrinary = do x <- readLogicalOr do start <- startSpan string "?" spacing y <- readTrinary string ":" spacing z <- readTrinary id <- endSpan start return $ TA_Trinary id x y z <|> return x readLogicalOr = readLogicalAnd `splitBy` ["||"] readLogicalAnd = readBitOr `splitBy` ["&&"] readBitOr = readBitXor `splitBy` ["|"] readBitXor = readBitAnd `splitBy` ["^"] readBitAnd = readEquated `splitBy` ["&"] readEquated = readCompared `splitBy` ["==", "!="] readCompared = readShift `splitBy` ["<=", ">=", "<", ">"] readShift = readAddition `splitBy` ["<<", ">>"] readAddition = chainl1 readMultiplication (readBinary ["+"] <|> readMinusOp) readMultiplication = readExponential `splitBy` ["*", "/", "%"] readExponential = readAnyNegated `splitBy` ["**"] readAnyNegated = readNegated <|> readAnySigned readNegated = do start <- startSpan op <- oneOf "!~" id <- endSpan start spacing x <- readAnyNegated return $ TA_Unary id [op] x readAnySigned = readSigned <|> readAnycremented readSigned = do start <- startSpan op <- choice (map readSignOp "+-") id <- endSpan start spacing x <- readAnycremented return $ TA_Unary id [op] x where readSignOp c = try $ do char c notFollowedBy2 $ char c spacing return c readAnycremented = readNormalOrPostfixIncremented <|> readPrefixIncremented readPrefixIncremented = do start <- startSpan op <- try $ string "++" <|> string "--" id <- endSpan start spacing x <- readArithTerm return $ TA_Unary id (op ++ "|") x readNormalOrPostfixIncremented = do x <- readArithTerm spacing do start <- startSpan op <- try $ string "++" <|> string "--" id <- endSpan start spacing return $ TA_Unary id ('|':op) x <|> return x prop_readCondition = isOk readCondition "[ \\( a = b \\) -a \\( c = d \\) ]" prop_readCondition2 = isOk readCondition "[[ (a = b) || (c = d) ]]" prop_readCondition3 = isOk readCondition "[[ $c = [[:alpha:].~-] ]]" prop_readCondition4 = isOk readCondition "[[ $c =~ *foo* ]]" prop_readCondition5 = isOk readCondition "[[ $c =~ f( ]] )* ]]" prop_readCondition5a = isOk readCondition "[[ $c =~ a(b) ]]" prop_readCondition5b = isOk readCondition "[[ $c =~ f( ($var ]]) )* ]]" prop_readCondition6 = isOk readCondition "[[ $c =~ ^[yY]$ ]]" prop_readCondition7 = isOk readCondition "[[ ${line} =~ ^[[:space:]]*# ]]" prop_readCondition8 = isOk readCondition "[[ $l =~ ogg|flac ]]" prop_readCondition9 = isOk readCondition "[ foo -a -f bar ]" prop_readCondition10 = isOk readCondition "[[\na == b\n||\nc == d ]]" prop_readCondition10a= isOk readCondition "[[\na == b ||\nc == d ]]" prop_readCondition10b= isOk readCondition "[[ a == b\n||\nc == d ]]" prop_readCondition11 = isOk readCondition "[[ a == b ||\n c == d ]]" prop_readCondition12 = isWarning readCondition "[ a == b \n -o c == d ]" prop_readCondition13 = isOk readCondition "[[ foo =~ ^fo{1,3}$ ]]" prop_readCondition14 = isOk readCondition "[ foo '>' bar ]" prop_readCondition15 = isOk readCondition "[ foo \">=\" bar ]" prop_readCondition16 = isOk readCondition "[ foo \\< bar ]" prop_readCondition17 = isOk readCondition "[[ ${file::1} = [-.\\|/\\\\] ]]" prop_readCondition18 = isOk readCondition "[ ]" prop_readCondition19 = isOk readCondition "[ '(' x \")\" ]" prop_readCondition20 = isOk readCondition "[[ echo_rc -eq 0 ]]" prop_readCondition21 = isOk readCondition "[[ $1 =~ ^(a\\ b)$ ]]" prop_readCondition22 = isOk readCondition "[[ $1 =~ \\.a\\.(\\.b\\.)\\.c\\. ]]" prop_readCondition23 = isOk readCondition "[[ -v arr[$var] ]]" readCondition = called "test expression" $ do opos <- getPosition start <- startSpan open <- try (string "[[") <|> string "[" let single = open == "[" let typ = if single then SingleBracket else DoubleBracket pos <- getPosition space <- allspacing when (null space) $ parseProblemAtWithEnd opos pos ErrorC 1035 $ "You need a space after the " ++ if single then "[ and before the ]." else "[[ and before the ]]." when (single && '\n' `elem` space) $ parseProblemAt pos ErrorC 1080 "You need \\ before line feeds to break lines in [ ]." condition <- readConditionContents single <|> do guard . not . null $ space lookAhead $ string "]" id <- endSpan start return $ TC_Empty id typ cpos <- getPosition close <- try (string "]]") <|> string "]" <|> fail "Expected test to end here (don't wrap commands in []/[[]])" id <- endSpan start when (open == "[[" && close /= "]]") $ parseProblemAt cpos ErrorC 1033 "Did you mean ]] ?" when (open == "[" && close /= "]" ) $ parseProblemAt opos ErrorC 1034 "Did you mean [[ ?" spacing many readCmdWord -- Read and throw away remainders to get then/do warnings. Fixme? return $ T_Condition id typ condition readAnnotationPrefix = do char '#' many linewhitespace string "shellcheck" prop_readAnnotation1 = isOk readAnnotation "# shellcheck disable=1234,5678\n" prop_readAnnotation2 = isOk readAnnotation "# shellcheck disable=SC1234 disable=SC5678\n" prop_readAnnotation3 = isOk readAnnotation "# shellcheck disable=SC1234 source=/dev/null disable=SC5678\n" prop_readAnnotation4 = isWarning readAnnotation "# shellcheck cats=dogs disable=SC1234\n" prop_readAnnotation5 = isOk readAnnotation "# shellcheck disable=SC2002 # All cats are precious\n" prop_readAnnotation6 = isOk readAnnotation "# shellcheck disable=SC1234 # shellcheck foo=bar\n" readAnnotation = called "shellcheck directive" $ do try readAnnotationPrefix many1 linewhitespace readAnnotationWithoutPrefix readAnnotationWithoutPrefix = do values <- many1 readKey optional readAnyComment void linefeed <|> eof <|> do parseNote ErrorC 1125 "Invalid key=value pair? Ignoring the rest of this directive starting here." many (noneOf "\n") void linefeed <|> eof many linewhitespace return $ concat values where readKey = do keyPos <- getPosition key <- many1 (letter <|> char '-') char '=' <|> fail "Expected '=' after directive key" annotations <- case key of "disable" -> readCode `sepBy` char ',' where readCode = do optional $ string "SC" int <- many1 digit return $ DisableComment (read int) "enable" -> readName `sepBy` char ',' where readName = EnableComment <$> many1 (letter <|> char '-') "source" -> do filename <- many1 $ noneOf " \n" return [SourceOverride filename] "source-path" -> do dirname <- many1 $ noneOf " \n" return [SourcePath dirname] "shell" -> do pos <- getPosition shell <- many1 $ noneOf " \n" when (isNothing $ shellForExecutable shell) $ parseNoteAt pos ErrorC 1103 "This shell type is unknown. Use e.g. sh or bash." return [ShellOverride shell] _ -> do parseNoteAt keyPos WarningC 1107 "This directive is unknown. It will be ignored." anyChar `reluctantlyTill` whitespace return [] many linewhitespace return annotations readAnnotations = do annotations <- many (readAnnotation `thenSkip` allspacing) return $ concat annotations readComment = do unexpecting "shellcheck annotation" readAnnotationPrefix readAnyComment readAnyComment = do char '#' many $ noneOf "\r\n" prop_readNormalWord = isOk readNormalWord "'foo'\"bar\"{1..3}baz$(lol)" prop_readNormalWord2 = isOk readNormalWord "foo**(foo)!!!(@@(bar))" prop_readNormalWord3 = isOk readNormalWord "foo#" prop_readNormalWord4 = isOk readNormalWord "$\"foo\"$'foo\nbar'" prop_readNormalWord5 = isWarning readNormalWord "${foo}}" prop_readNormalWord6 = isOk readNormalWord "foo/{}" prop_readNormalWord7 = isOk readNormalWord "foo\\\nbar" prop_readNormalWord8 = isWarning readSubshell "(foo\\ \nbar)" prop_readNormalWord9 = isOk readSubshell "(foo\\ ;\nbar)" prop_readNormalWord10 = isWarning readNormalWord "\x201Chello\x201D" prop_readNormalWord11 = isWarning readNormalWord "\x2018hello\x2019" prop_readNormalWord12 = isWarning readNormalWord "hello\x2018" readNormalWord = readNormalishWord "" readNormalishWord end = do start <- startSpan pos <- getPosition x <- many1 (readNormalWordPart end) id <- endSpan start checkPossibleTermination pos x return $ T_NormalWord id x readIndexSpan = do start <- startSpan x <- many (readNormalWordPart "]" <|> someSpace <|> otherLiteral) id <- endSpan start return $ T_NormalWord id x where someSpace = do start <- startSpan str <- spacing1 id <- endSpan start return $ T_Literal id str otherLiteral = do start <- startSpan str <- many1 $ oneOf quotableChars id <- endSpan start return $ T_Literal id str checkPossibleTermination pos [T_Literal _ x] = when (x `elem` ["do", "done", "then", "fi", "esac"]) $ parseProblemAt pos WarningC 1010 $ "Use semicolon or linefeed before '" ++ x ++ "' (or quote to make it literal)." checkPossibleTermination _ _ = return () readNormalWordPart end = do notFollowedBy2 $ oneOf end checkForParenthesis choice [ readSingleQuoted, readDoubleQuoted, readGlob, readNormalDollar, readBraced, readUnquotedBackTicked, readProcSub, readUnicodeQuote, readNormalLiteral end, readLiteralCurlyBraces ] where checkForParenthesis = return () `attempting` do pos <- getPosition lookAhead $ char '(' parseProblemAt pos ErrorC 1036 "'(' is invalid here. Did you forget to escape it?" readLiteralCurlyBraces = do start <- startSpan str <- findParam <|> literalBraces id <- endSpan start return $ T_Literal id str findParam = try $ string "{}" literalBraces = do pos <- getPosition c <- oneOf "{}" parseProblemAt pos WarningC 1083 $ "This " ++ [c] ++ " is literal. Check expression (missing ;/\\n?) or quote it." return [c] readSpacePart = do start <- startSpan x <- many1 whitespace id <- endSpan start return $ T_Literal id x readDollarBracedWord = do start <- startSpan list <- many readDollarBracedPart id <- endSpan start return $ T_NormalWord id list readDollarBracedPart = readSingleQuoted <|> readDoubleQuoted <|> readParamSubSpecialChar <|> readExtglob <|> readNormalDollar <|> readUnquotedBackTicked <|> readDollarBracedLiteral readDollarBracedLiteral = do start <- startSpan vars <- (readBraceEscaped <|> (anyChar >>= \x -> return [x])) `reluctantlyTill1` bracedQuotable id <- endSpan start return $ T_Literal id $ concat vars readParamSubSpecialChar = do start <- startSpan x <- many1 paramSubSpecialChars id <- endSpan start return $ T_ParamSubSpecialChar id x prop_readProcSub1 = isOk readProcSub "<(echo test | wc -l)" prop_readProcSub2 = isOk readProcSub "<( if true; then true; fi )" prop_readProcSub3 = isOk readProcSub "<( # nothing here \n)" readProcSub = called "process substitution" $ do start <- startSpan dir <- try $ do x <- oneOf "<>" char '(' return [x] list <- readCompoundListOrEmpty allspacing char ')' id <- endSpan start return $ T_ProcSub id dir list prop_readSingleQuoted = isOk readSingleQuoted "'foo bar'" prop_readSingleQuoted2 = isWarning readSingleQuoted "'foo bar\\'" prop_readSingleQuoted4 = isWarning readNormalWord "'it's" prop_readSingleQuoted5 = isWarning readSimpleCommand "foo='bar\ncow 'arg" prop_readSingleQuoted6 = isOk readSimpleCommand "foo='bar cow 'arg" prop_readSingleQuoted7 = isOk readSingleQuoted "'foo\x201C\&bar'" prop_readSingleQuoted8 = isWarning readSingleQuoted "'foo\x2018\&bar'" readSingleQuoted = called "single quoted string" $ do start <- startSpan startPos <- getPosition singleQuote s <- many readSingleQuotedPart let string = concat s endPos <- getPosition singleQuote <|> fail "Expected end of single quoted string" optional $ do c <- try . lookAhead $ suspectCharAfterQuotes <|> oneOf "'" if not (null string) && isAlpha c && isAlpha (last string) then parseProblemAt endPos WarningC 1011 "This apostrophe terminated the single quoted string!" else when ('\n' `elem` string && not ("\n" `isPrefixOf` string)) $ suggestForgotClosingQuote startPos endPos "single quoted string" id <- endSpan start return (T_SingleQuoted id string) readSingleQuotedLiteral = do singleQuote strs <- many1 readSingleQuotedPart singleQuote return $ concat strs readSingleQuotedPart = readSingleEscaped <|> many1 (noneOf $ "'\\" ++ unicodeSingleQuotes) <|> readUnicodeQuote where readUnicodeQuote = do pos <- getPosition x <- oneOf unicodeSingleQuotes parseProblemAt pos WarningC 1112 "This is a unicode quote. Delete and retype it (or ignore/doublequote for literal)." return [x] prop_readBackTicked = isOk (readBackTicked False) "`ls *.mp3`" prop_readBackTicked2 = isOk (readBackTicked False) "`grep \"\\\"\"`" prop_readBackTicked3 = isWarning (readBackTicked False) "´grep \"\\\"\"´" prop_readBackTicked4 = isOk readSimpleCommand "`echo foo\necho bar`" prop_readBackTicked5 = isOk readSimpleCommand "echo `foo`bar" prop_readBackTicked6 = isWarning readSimpleCommand "echo `foo\necho `bar" prop_readBackTicked7 = isOk readSimpleCommand "`#inline comment`" prop_readBackTicked8 = isOk readSimpleCommand "echo `#comment` \\\nbar baz" readQuotedBackTicked = readBackTicked True readUnquotedBackTicked = readBackTicked False readBackTicked quoted = called "backtick expansion" $ do start <- startSpan startPos <- getPosition backtick subStart <- getPosition subString <- readGenericLiteral "`´" endPos <- getPosition backtick id <- endSpan start optional $ do c <- try . lookAhead $ suspectCharAfterQuotes when ('\n' `elem` subString && not ("\n" `isPrefixOf` subString)) $ suggestForgotClosingQuote startPos endPos "backtick expansion" -- Result positions may be off due to escapes result <- subParse subStart (tryWithErrors subParser <|> return []) (unEscape subString) return $ T_Backticked id result where unEscape [] = [] unEscape ('\\':'"':rest) | quoted = '"' : unEscape rest unEscape ('\\':x:rest) | x `elem` "$`\\" = x : unEscape rest unEscape ('\\':'\n':rest) = unEscape rest unEscape (c:rest) = c : unEscape rest subParser = do cmds <- readCompoundListOrEmpty verifyEof return cmds backtick = void (char '`') <|> do pos <- getPosition char '´' parseProblemAt pos ErrorC 1077 "For command expansion, the tick should slant left (` vs ´). Use $(..) instead." -- Run a parser on a new input, such as for `..` or here documents. subParse pos parser input = do lastPosition <- getPosition lastInput <- getInput setPosition pos setInput input result <- parser setInput lastInput setPosition lastPosition return result -- Parse something, but forget all parseProblems inSeparateContext = parseForgettingContext True -- Parse something, but forget all parseProblems on failure forgetOnFailure = parseForgettingContext False parseForgettingContext alsoOnSuccess parser = do context <- Ms.get success context <|> failure context where success c = do res <- try parser when alsoOnSuccess $ Ms.put c return res failure c = do Ms.put c fail "" prop_readDoubleQuoted = isOk readDoubleQuoted "\"Hello $FOO\"" prop_readDoubleQuoted2 = isOk readDoubleQuoted "\"$'\"" prop_readDoubleQuoted3 = isOk readDoubleQuoted "\"\x2018hello\x2019\"" prop_readDoubleQuoted4 = isWarning readSimpleCommand "\"foo\nbar\"foo" prop_readDoubleQuoted5 = isOk readSimpleCommand "lol \"foo\nbar\" etc" prop_readDoubleQuoted6 = isOk readSimpleCommand "echo \"${ ls; }\"" prop_readDoubleQuoted7 = isOk readSimpleCommand "echo \"${ ls;}bar\"" prop_readDoubleQuoted8 = isWarning readDoubleQuoted "\"\x201Chello\x201D\"" prop_readDoubleQuoted10 = isOk readDoubleQuoted "\"foo\\\\n\"" readDoubleQuoted = called "double quoted string" $ do start <- startSpan startPos <- getPosition doubleQuote x <- many doubleQuotedPart endPos <- getPosition doubleQuote <|> fail "Expected end of double quoted string" id <- endSpan start optional $ do try . lookAhead $ suspectCharAfterQuotes <|> oneOf "$\"" when (any hasLineFeed x && not (startsWithLineFeed x)) $ suggestForgotClosingQuote startPos endPos "double quoted string" return $ T_DoubleQuoted id x where startsWithLineFeed (T_Literal _ ('\n':_):_) = True startsWithLineFeed _ = False hasLineFeed (T_Literal _ str) | '\n' `elem` str = True hasLineFeed _ = False suggestForgotClosingQuote startPos endPos name = do parseProblemAt startPos WarningC 1078 $ "Did you forget to close this " ++ name ++ "?" parseProblemAt endPos InfoC 1079 "This is actually an end quote, but due to next char it looks suspect." doubleQuotedPart = readDoubleLiteral <|> readDoubleQuotedDollar <|> readQuotedBackTicked <|> readUnicodeQuote where readUnicodeQuote = do pos <- getPosition start <- startSpan c <- oneOf unicodeDoubleQuotes id <- endSpan start parseProblemAt pos WarningC 1111 "This is a unicode quote. Delete and retype it (or ignore/singlequote for literal)." return $ T_Literal id [c] readDoubleLiteral = do start <- startSpan s <- many1 readDoubleLiteralPart id <- endSpan start return $ T_Literal id (concat s) readDoubleLiteralPart = do x <- many1 (readDoubleEscaped <|> many1 (noneOf (doubleQuotableChars ++ unicodeDoubleQuotes))) return $ concat x readNormalLiteral end = do start <- startSpan s <- many1 (readNormalLiteralPart end) id <- endSpan start return $ T_Literal id (concat s) prop_readGlob1 = isOk readGlob "*" prop_readGlob2 = isOk readGlob "[^0-9]" prop_readGlob3 = isOk readGlob "[a[:alpha:]]" prop_readGlob4 = isOk readGlob "[[:alnum:]]" prop_readGlob5 = isOk readGlob "[^[:alpha:]1-9]" prop_readGlob6 = isOk readGlob "[\\|]" prop_readGlob7 = isOk readGlob "[^[]" prop_readGlob8 = isOk readGlob "[*?]" readGlob = readExtglob <|> readSimple <|> readClass <|> readGlobbyLiteral where readSimple = do start <- startSpan c <- oneOf "*?" id <- endSpan start return $ T_Glob id [c] -- Doesn't handle weird things like [^]a] and [$foo]. fixme? readClass = try $ do start <- startSpan char '[' s <- many1 (predefined <|> readNormalLiteralPart "]" <|> globchars) char ']' id <- endSpan start return $ T_Glob id $ "[" ++ concat s ++ "]" where globchars = fmap return . oneOf $ "!$[" ++ extglobStartChars predefined = do try $ string "[:" s <- many1 letter string ":]" return $ "[:" ++ s ++ ":]" readGlobbyLiteral = do start <- startSpan c <- extglobStart <|> char '[' id <- endSpan start return $ T_Literal id [c] readNormalLiteralPart customEnd = readNormalEscaped <|> many1 (noneOf (customEnd ++ standardEnd)) where standardEnd = "[{}" ++ quotableChars ++ extglobStartChars ++ unicodeDoubleQuotes ++ unicodeSingleQuotes readNormalEscaped = called "escaped char" $ do pos <- getPosition backslash do next <- quotable <|> oneOf "?*@!+[]{}.,~#" when (next == ' ') $ checkTrailingSpaces pos <|> return () return $ if next == '\n' then "" else [next] <|> do next <- anyChar case escapedChar next of Just name -> parseNoteAt pos WarningC 1012 $ "\\" ++ [next] ++ " is just literal '" ++ [next] ++ "' here. For " ++ name ++ ", use " ++ alternative next ++ " instead." Nothing -> parseNoteAt pos InfoC 1001 $ "This \\" ++ [next] ++ " will be a regular '" ++ [next] ++ "' in this context." return [next] where alternative 'n' = "a quoted, literal line feed" alternative t = "\"$(printf '\\" ++ [t] ++ "')\"" escapedChar 'n' = Just "line feed" escapedChar 't' = Just "tab" escapedChar 'r' = Just "carriage return" escapedChar _ = Nothing checkTrailingSpaces pos = lookAhead . try $ do many linewhitespace void linefeed <|> eof parseProblemAt pos ErrorC 1101 "Delete trailing spaces after \\ to break line (or use quotes for literal space)." prop_readExtglob1 = isOk readExtglob "!(*.mp3)" prop_readExtglob2 = isOk readExtglob "!(*.mp3|*.wmv)" prop_readExtglob4 = isOk readExtglob "+(foo \\) bar)" prop_readExtglob5 = isOk readExtglob "+(!(foo *(bar)))" prop_readExtglob6 = isOk readExtglob "*(((||))|())" prop_readExtglob7 = isOk readExtglob "*(<>)" prop_readExtglob8 = isOk readExtglob "@(|*())" readExtglob = called "extglob" $ do start <- startSpan c <- try $ do f <- extglobStart char '(' return f contents <- readExtglobPart `sepBy` char '|' char ')' id <- endSpan start return $ T_Extglob id [c] contents readExtglobPart = do start <- startSpan x <- many (readExtglobGroup <|> readNormalWordPart "" <|> readSpacePart <|> readExtglobLiteral) id <- endSpan start return $ T_NormalWord id x where readExtglobGroup = do char '(' start <- startSpan contents <- readExtglobPart `sepBy` char '|' id <- endSpan start char ')' return $ T_Extglob id "" contents readExtglobLiteral = do start <- startSpan str <- many1 (oneOf "<>#;&") id <- endSpan start return $ T_Literal id str readSingleEscaped = do pos <- getPosition s <- backslash x <- lookAhead anyChar case x of '\'' -> parseProblemAt pos InfoC 1003 "Want to escape a single quote? echo 'This is how it'\\''s done'."; '\n' -> parseProblemAt pos InfoC 1004 "This backslash+linefeed is literal. Break outside single quotes if you just want to break the line." _ -> return () return [s] readDoubleEscaped = do pos <- getPosition bs <- backslash (linefeed >> return "") <|> fmap return doubleQuotable <|> do c <- anyChar -- This is an invalid escape sequence where the \ is literal. -- Previously this caused a SC1117, which may be re-enabled as -- as a pedantic warning. return [bs, c] readBraceEscaped = do bs <- backslash (linefeed >> return "") <|> fmap return bracedQuotable <|> fmap (\ x -> [bs, x]) anyChar readGenericLiteral endChars = do strings <- many (readGenericEscaped <|> many1 (noneOf ('\\':endChars))) return $ concat strings readGenericLiteral1 endExp = do strings <- (readGenericEscaped <|> (anyChar >>= \x -> return [x])) `reluctantlyTill1` endExp return $ concat strings readGenericEscaped = do backslash x <- anyChar return $ if x == '\n' then [] else ['\\', x] prop_readBraced = isOk readBraced "{1..4}" prop_readBraced2 = isOk readBraced "{foo,bar,\"baz lol\"}" prop_readBraced3 = isOk readBraced "{1,\\},2}" prop_readBraced4 = isOk readBraced "{1,{2,3}}" prop_readBraced5 = isOk readBraced "{JP{,E}G,jp{,e}g}" prop_readBraced6 = isOk readBraced "{foo,bar,$((${var}))}" prop_readBraced7 = isNotOk readBraced "{}" prop_readBraced8 = isNotOk readBraced "{foo}" readBraced = try braceExpansion where braceExpansion = T_BraceExpansion `withParser` do char '{' elements <- bracedElement `sepBy1` char ',' guard $ case elements of (_:_:_) -> True [t] -> ".." `isInfixOf` onlyLiteralString t [] -> False char '}' return elements bracedElement = T_NormalWord `withParser` do many $ choice [ braceExpansion, readDollarExpression, readSingleQuoted, readDoubleQuoted, braceLiteral ] braceLiteral = T_Literal `withParser` readGenericLiteral1 (oneOf "{}\"$'," <|> whitespace) ensureDollar = -- The grammar should have been designed along the lines of readDollarExpr = char '$' >> stuff, but -- instead, each subunit parses its own $. This results in ~7 1-3 char lookaheads instead of one 1-char. -- Instead of optimizing the grammar, here's a green cut that decreases shellcheck runtime by 10%: lookAhead $ char '$' readNormalDollar = do ensureDollar readDollarExp <|> readDollarDoubleQuote <|> readDollarSingleQuote <|> readDollarLonely False readDoubleQuotedDollar = do ensureDollar readDollarExp <|> readDollarLonely True prop_readDollarExpression1 = isOk readDollarExpression "$(((1) && 3))" prop_readDollarExpression2 = isWarning readDollarExpression "$(((1)) && 3)" prop_readDollarExpression3 = isWarning readDollarExpression "$((\"$@\" &); foo;)" readDollarExpression :: Monad m => SCParser m Token readDollarExpression = do ensureDollar readDollarExp readDollarExp = arithmetic <|> readDollarExpansion <|> readDollarBracket <|> readDollarBraceCommandExpansion <|> readDollarBraced <|> readDollarVariable where arithmetic = readAmbiguous "$((" readDollarArithmetic readDollarExpansion (\pos -> parseNoteAt pos WarningC 1102 "Shells disambiguate $(( differently or not at all. For $(command substition), add space after $( . For $((arithmetics)), fix parsing errors.") prop_readDollarSingleQuote = isOk readDollarSingleQuote "$'foo\\\'lol'" readDollarSingleQuote = called "$'..' expression" $ do start <- startSpan try $ string "$'" str <- readGenericLiteral "'" char '\'' id <- endSpan start return $ T_DollarSingleQuoted id str prop_readDollarDoubleQuote = isOk readDollarDoubleQuote "$\"hello\"" readDollarDoubleQuote = do lookAhead . try $ string "$\"" start <- startSpan char '$' doubleQuote x <- many doubleQuotedPart doubleQuote <|> fail "Expected end of translated double quoted string" id <- endSpan start return $ T_DollarDoubleQuoted id x prop_readDollarArithmetic = isOk readDollarArithmetic "$(( 3 * 4 +5))" prop_readDollarArithmetic2 = isOk readDollarArithmetic "$(((3*4)+(1*2+(3-1))))" readDollarArithmetic = called "$((..)) expression" $ do start <- startSpan try (string "$((") c <- readArithmeticContents pos <- getPosition char ')' char ')' <|> fail "Expected a double )) to end the $((..))" id <- endSpan start return (T_DollarArithmetic id c) readDollarBracket = called "$[..] expression" $ do start <- startSpan try (string "$[") c <- readArithmeticContents string "]" id <- endSpan start return (T_DollarBracket id c) prop_readArithmeticExpression = isOk readArithmeticExpression "((a?b:c))" readArithmeticExpression = called "((..)) command" $ do start <- startSpan try (string "((") c <- readArithmeticContents string "))" id <- endSpan start return (T_Arithmetic id c) -- If the next characters match prefix, try two different parsers and warn if the alternate parser had to be used readAmbiguous :: Monad m => String -> SCParser m p -> SCParser m p -> (SourcePos -> SCParser m ()) -> SCParser m p readAmbiguous prefix expected alternative warner = do pos <- getPosition try . lookAhead $ string prefix -- If the expected parser fails, try the alt. -- If the alt fails, run the expected one again for the errors. try expected <|> try (withAlt pos) <|> expected where withAlt pos = do t <- forgetOnFailure alternative warner pos return t prop_readDollarBraceCommandExpansion1 = isOk readDollarBraceCommandExpansion "${ ls; }" prop_readDollarBraceCommandExpansion2 = isOk readDollarBraceCommandExpansion "${\nls\n}" readDollarBraceCommandExpansion = called "ksh ${ ..; } command expansion" $ do start <- startSpan try $ do string "${" whitespace allspacing term <- readTerm char '}' <|> fail "Expected } to end the ksh ${ ..; } command expansion" id <- endSpan start return $ T_DollarBraceCommandExpansion id term prop_readDollarBraced1 = isOk readDollarBraced "${foo//bar/baz}" prop_readDollarBraced2 = isOk readDollarBraced "${foo/'{cow}'}" prop_readDollarBraced3 = isOk readDollarBraced "${foo%%$(echo cow\\})}" prop_readDollarBraced4 = isOk readDollarBraced "${foo#\\}}" readDollarBraced = called "parameter expansion" $ do start <- startSpan try (string "${") word <- readDollarBracedWord char '}' id <- endSpan start return $ T_DollarBraced id True word prop_readDollarExpansion1= isOk readDollarExpansion "$(echo foo; ls\n)" prop_readDollarExpansion2= isOk readDollarExpansion "$( )" prop_readDollarExpansion3= isOk readDollarExpansion "$( command \n#comment \n)" readDollarExpansion = called "command expansion" $ do start <- startSpan try (string "$(") cmds <- readCompoundListOrEmpty char ')' <|> fail "Expected end of $(..) expression" id <- endSpan start return $ T_DollarExpansion id cmds prop_readDollarVariable = isOk readDollarVariable "$@" prop_readDollarVariable2 = isOk (readDollarVariable >> anyChar) "$?!" prop_readDollarVariable3 = isWarning (readDollarVariable >> anyChar) "$10" prop_readDollarVariable4 = isWarning (readDollarVariable >> string "[@]") "$arr[@]" prop_readDollarVariable5 = isWarning (readDollarVariable >> string "[f") "$arr[f" readDollarVariable :: Monad m => SCParser m Token readDollarVariable = do start <- startSpan pos <- getPosition let singleCharred p = do value <- wrapString ((:[]) <$> p) id <- endSpan start return $ (T_DollarBraced id False value) let positional = do value <- singleCharred digit return value `attempting` do lookAhead digit parseNoteAt pos ErrorC 1037 "Braces are required for positionals over 9, e.g. ${10}." let special = singleCharred specialVariable let regular = do value <- wrapString readVariableName id <- endSpan start return (T_DollarBraced id False value) `attempting` do lookAhead $ char '[' parseNoteAt pos ErrorC 1087 "Use braces when expanding arrays, e.g. ${array[idx]} (or ${var}[.. to quiet)." try $ char '$' >> (positional <|> special <|> regular) where wrapString p = do start <- getPosition s <- p end <- getPosition id1 <- getNextIdBetween start end id2 <- getNextIdBetween start end return $ T_NormalWord id1 [T_Literal id2 s] readVariableName = do f <- variableStart rest <- many variableChars return (f:rest) prop_readDollarLonely1 = isWarning readNormalWord "\"$\"var" prop_readDollarLonely2 = isWarning readNormalWord "\"$\"\"var\"" prop_readDollarLonely3 = isOk readNormalWord "\"$\"$var" prop_readDollarLonely4 = isOk readNormalWord "\"$\"*" prop_readDollarLonely5 = isOk readNormalWord "$\"str\"" readDollarLonely quoted = do start <- startSpan char '$' id <- endSpan start when quoted $ do isHack <- quoteForEscape when isHack $ parseProblemAtId id StyleC 1135 "Prefer escape over ending quote to make $ literal. Instead of \"It costs $\"5, use \"It costs \\$5\"." return $ T_Literal id "$" where quoteForEscape = option False $ try . lookAhead $ do char '"' -- Check for "foo $""bar" optional $ char '"' c <- anyVar -- Don't trigger on [[ x == "$"* ]] or "$"$pattern return $ c `notElem` "*$" anyVar = variableStart <|> digit <|> specialVariable prop_readHereDoc = isOk readScript "cat << foo\nlol\ncow\nfoo" prop_readHereDoc2 = isNotOk readScript "cat <<- EOF\n cow\n EOF" prop_readHereDoc3 = isOk readScript "cat << foo\n$\"\nfoo" prop_readHereDoc4 = isNotOk readScript "cat << foo\n`\nfoo" prop_readHereDoc5 = isOk readScript "cat <<- !foo\nbar\n!foo" prop_readHereDoc6 = isOk readScript "cat << foo\\ bar\ncow\nfoo bar" prop_readHereDoc7 = isOk readScript "cat << foo\n\\$(f ())\nfoo" prop_readHereDoc8 = isOk readScript "cat <>bar\netc\nfoo" prop_readHereDoc9 = isOk readScript "if true; then cat << foo; fi\nbar\nfoo\n" prop_readHereDoc10= isOk readScript "if true; then cat << foo << bar; fi\nfoo\nbar\n" prop_readHereDoc11= isOk readScript "cat << foo $(\nfoo\n)lol\nfoo\n" prop_readHereDoc12= isOk readScript "cat << foo|cat\nbar\nfoo" prop_readHereDoc13= isOk readScript "cat <<'#!'\nHello World\n#!\necho Done" prop_readHereDoc14= isWarning readScript "cat << foo\nbar\nfoo \n" prop_readHereDoc15= isWarning readScript "cat <> return Dashed) <|> return Undashed sp <- spacing optional $ do try . lookAhead $ char '(' let message = "Shells are space sensitive. Use '< <(cmd)', not '<<" ++ sp ++ "(cmd)'." parseProblemAt pos ErrorC 1038 message start <- startSpan (quoted, endToken) <- readToken hid <- endSpan start -- add empty tokens for now, read the rest in readPendingHereDocs let doc = T_HereDoc hid dashed quoted endToken [] addPendingHereDoc doc return doc where quotes = "\"'\\" -- Fun fact: bash considers << foo"" quoted, but not << <("foo"). -- Instead of replicating this, just read a token and strip quotes. readToken = do str <- readStringForParser readNormalWord return (if any (`elem` quotes) str then Quoted else Unquoted, filter (not . (`elem` quotes)) str) readPendingHereDocs = do docs <- popPendingHereDocs mapM_ readDoc docs where readDoc (HereDocPending (T_HereDoc id dashed quoted endToken _) ctx) = swapContext ctx $ do docStartPos <- getPosition (terminated, wasWarned, lines) <- readDocLines dashed endToken docEndPos <- getPosition let hereData = unlines lines unless terminated $ do unless wasWarned $ debugHereDoc id endToken hereData fail "Here document was not correctly terminated" list <- parseHereData quoted (docStartPos, docEndPos) hereData addToHereDocMap id list -- Read the lines making up the here doc. Returns (IsTerminated, Lines) readDocLines :: Monad m => Dashed -> String -> SCParser m (Bool, Bool, [String]) readDocLines dashed endToken = do pos <- getPosition str <- rawLine isEof <- option False (eof >> return True) (isEnd, wasWarned) <- subParse pos checkEnd str if | isEnd -> return (True, wasWarned, []) | isEof -> return (False, wasWarned, [str]) | True -> do (ok, previousWarning, rest) <- readDocLines dashed endToken return (ok, wasWarned || previousWarning, str:rest) where -- Check if this is the actual end, or a plausible false end checkEnd = option (False, False) $ try $ do -- Match what's basically '^( *)token( *)(.*)$' leadingSpacePos <- getPosition leadingSpace <- linewhitespace `reluctantlyTill` string endToken string endToken trailingSpacePos <- getPosition trailingSpace <- many linewhitespace trailerPos <- getPosition trailer <- many anyChar let leadingSpacesAreTabs = all (== '\t') leadingSpace let thereIsNoTrailer = null trailingSpace && null trailer let leaderIsOk = null leadingSpace || dashed == Dashed && leadingSpacesAreTabs let trailerStart = if null trailer then '\0' else head trailer let hasTrailingSpace = not $ null trailingSpace let hasTrailer = not $ null trailer let ppt = parseProblemAt trailerPos ErrorC if leaderIsOk && thereIsNoTrailer then return (True, False) else do let foundCause = return (False, True) let skipLine = return (False, False) -- This may be intended as an end token. Debug why it isn't. if | trailerStart == ')' -> do ppt 1119 $ "Add a linefeed between end token and terminating ')'." foundCause | trailerStart == '#' -> do ppt 1120 "No comments allowed after here-doc token. Comment the next line instead." foundCause | trailerStart `elem` ";>|&" -> do ppt 1121 "Add ;/& terminators (and other syntax) on the line with the <<, not here." foundCause | hasTrailingSpace && hasTrailer -> do ppt 1122 "Nothing allowed after end token. To continue a command, put it on the line with the <<." foundCause | leaderIsOk && hasTrailingSpace && not hasTrailer -> do parseProblemAt trailingSpacePos ErrorC 1118 "Delete whitespace after the here-doc end token." -- Parse as if it's the actual end token. Will koala_man regret this once again? return (True, True) | not hasTrailingSpace && hasTrailer -> -- The end token is just a prefix skipLine | hasTrailer -> error "ShellCheck bug, please report (here doc trailer)." -- The following cases assume no trailing text: | dashed == Undashed && (not $ null leadingSpace) -> do parseProblemAt leadingSpacePos ErrorC 1039 "Remove indentation before end token (or use <<- and indent with tabs)." foundCause | dashed == Dashed && not leadingSpacesAreTabs -> do parseProblemAt leadingSpacePos ErrorC 1040 "When using <<-, you can only indent with tabs." foundCause | True -> skipLine rawLine = do c <- many $ noneOf "\n" void (char '\n') <|> eof return c parseHereData Quoted (start,end) hereData = do id <- getNextIdBetween start end return [T_Literal id hereData] parseHereData Unquoted (startPos, _) hereData = subParse startPos readHereData hereData readHereData = many $ doubleQuotedPart <|> readHereLiteral readHereLiteral = do start <- startSpan chars <- many1 $ noneOf "`$\\" id <- endSpan start return $ T_Literal id chars debugHereDoc tokenId endToken doc | endToken `isInfixOf` doc = let lookAt line = when (endToken `isInfixOf` line) $ parseProblemAtId tokenId ErrorC 1042 ("Close matches include '" ++ line ++ "' (!= '" ++ endToken ++ "').") in do parseProblemAtId tokenId ErrorC 1041 ("Found '" ++ endToken ++ "' further down, but not on a separate line.") mapM_ lookAt (lines doc) | map toLower endToken `isInfixOf` map toLower doc = parseProblemAtId tokenId ErrorC 1043 ("Found " ++ endToken ++ " further down, but with wrong casing.") | otherwise = parseProblemAtId tokenId ErrorC 1044 ("Couldn't find end token `" ++ endToken ++ "' in the here document.") readFilename = readNormalWord readIoFileOp = choice [g_DGREAT, g_LESSGREAT, g_GREATAND, g_LESSAND, g_CLOBBER, redirToken '<' T_Less, redirToken '>' T_Greater ] readIoDuplicate = try $ do start <- startSpan op <- g_GREATAND <|> g_LESSAND target <- readIoVariable <|> digitsAndOrDash id <- endSpan start return $ T_IoDuplicate id op target where -- either digits with optional dash, or a required dash digitsAndOrDash = do str <- many digit dash <- (if null str then id else option "") $ string "-" return $ str ++ dash prop_readIoFile = isOk readIoFile ">> \"$(date +%YYmmDD)\"" readIoFile = called "redirection" $ do start <- startSpan op <- readIoFileOp spacing file <- readFilename id <- endSpan start return $ T_IoFile id op file readIoVariable = try $ do char '{' x <- readVariableName char '}' return $ "{" ++ x ++ "}" readIoSource = try $ do x <- string "&" <|> readIoVariable <|> many digit lookAhead $ void readIoFileOp <|> void (string "<<") return x prop_readIoRedirect = isOk readIoRedirect "3>&2" prop_readIoRedirect2 = isOk readIoRedirect "2> lol" prop_readIoRedirect3 = isOk readIoRedirect "4>&-" prop_readIoRedirect4 = isOk readIoRedirect "&> lol" prop_readIoRedirect5 = isOk readIoRedirect "{foo}>&2" prop_readIoRedirect6 = isOk readIoRedirect "{foo}<&-" prop_readIoRedirect7 = isOk readIoRedirect "{foo}>&1-" readIoRedirect = do start <- startSpan n <- readIoSource redir <- readHereString <|> readHereDoc <|> readIoDuplicate <|> readIoFile id <- endSpan start skipAnnotationAndWarn spacing return $ T_FdRedirect id n redir readRedirectList = many1 readIoRedirect prop_readHereString = isOk readHereString "<<< \"Hello $world\"" readHereString = called "here string" $ do start <- startSpan try $ string "<<<" id <- endSpan start spacing word <- readNormalWord return $ T_HereString id word readNewlineList = many1 ((linefeed <|> carriageReturn) `thenSkip` spacing) <* checkBadBreak where checkBadBreak = optional $ do pos <- getPosition try $ lookAhead (oneOf "|&") -- See if the next thing could be |, || or && parseProblemAt pos ErrorC 1133 "Unexpected start of line. If breaking lines, |/||/&& should be at the end of the previous one." readLineBreak = optional readNewlineList prop_readSeparator1 = isWarning readScript "a &; b" prop_readSeparator2 = isOk readScript "a & b" prop_readSeparator3 = isWarning readScript "a & b" prop_readSeparator4 = isWarning readScript "a > file; b" prop_readSeparator5 = isWarning readScript "curl https://example.com/?foo=moo&bar=cow" readSeparatorOp = do notFollowedBy2 (void g_AND_IF <|> void readCaseSeparator) notFollowedBy2 (string "&>") start <- getPosition f <- try (do pos <- getPosition char '&' optional $ choice [ do s <- lookAhead . choice . map (try . string) $ ["amp;", "gt;", "lt;"] parseProblemAt pos ErrorC 1109 "This is an unquoted HTML entity. Replace with corresponding character.", do try . lookAhead $ variableStart parseProblemAt pos WarningC 1132 "This & terminates the command. Escape it or add space after & to silence." ] spacing pos <- getPosition char ';' -- In case statements we might have foo & ;; notFollowedBy2 $ char ';' parseProblemAt pos ErrorC 1045 "It's not 'foo &; bar', just 'foo & bar'." return '&' ) <|> char ';' <|> char '&' end <- getPosition spacing return (f, (start, end)) readSequentialSep = void (g_Semi >> readLineBreak) <|> void readNewlineList readSeparator = do separator <- readSeparatorOp readLineBreak return separator <|> do start <- getPosition readNewlineList end <- getPosition return ('\n', (start, end)) prop_readSimpleCommand = isOk readSimpleCommand "echo test > file" prop_readSimpleCommand2 = isOk readSimpleCommand "cmd &> file" prop_readSimpleCommand3 = isOk readSimpleCommand "export foo=(bar baz)" prop_readSimpleCommand4 = isOk readSimpleCommand "typeset -a foo=(lol)" prop_readSimpleCommand5 = isOk readSimpleCommand "time if true; then echo foo; fi" prop_readSimpleCommand6 = isOk readSimpleCommand "time -p ( ls -l; )" prop_readSimpleCommand7 = isOk readSimpleCommand "\\ls" prop_readSimpleCommand8 = isWarning readSimpleCommand "// Lol" prop_readSimpleCommand9 = isWarning readSimpleCommand "/* Lolbert */" prop_readSimpleCommand10 = isWarning readSimpleCommand "/**** Lolbert */" prop_readSimpleCommand11 = isOk readSimpleCommand "/\\* foo" prop_readSimpleCommand12 = isWarning readSimpleCommand "elsif foo" prop_readSimpleCommand13 = isWarning readSimpleCommand "ElseIf foo" prop_readSimpleCommand14 = isWarning readSimpleCommand "elseif[$i==2]" readSimpleCommand = called "simple command" $ do prefix <- option [] readCmdPrefix skipAnnotationAndWarn cmd <- option Nothing $ Just <$> readCmdName when (null prefix && isNothing cmd) $ fail "Expected a command" case cmd of Nothing -> do id1 <- getNextIdSpanningTokenList prefix id2 <- getNewIdFor id1 return $ makeSimpleCommand id1 id2 prefix [] [] Just cmd -> do validateCommand cmd suffix <- option [] $ getParser readCmdSuffix cmd [ (["declare", "export", "local", "readonly", "typeset"], readModifierSuffix), (["time"], readTimeSuffix), (["let"], readLetSuffix), (["eval"], readEvalSuffix) ] id1 <- getNextIdSpanningTokenList (prefix ++ (cmd:suffix)) id2 <- getNewIdFor id1 let result = makeSimpleCommand id1 id2 prefix [cmd] suffix if isCommand ["source", "."] cmd then readSource result else return result where isCommand strings (T_NormalWord _ [T_Literal _ s]) = s `elem` strings isCommand _ _ = False getParser def cmd [] = def getParser def cmd ((list, action):rest) = if isCommand list cmd then action else getParser def cmd rest cStyleComment cmd = case cmd of _ -> False validateCommand cmd = case cmd of (T_NormalWord _ [T_Literal _ "//"]) -> commentWarning (getId cmd) (T_NormalWord _ (T_Literal _ "/" : T_Glob _ "*" :_)) -> commentWarning (getId cmd) (T_NormalWord _ (T_Literal _ str:_)) -> do let cmdString = map toLower $ takeWhile isAlpha str when (cmdString `elem` ["elsif", "elseif"]) $ parseProblemAtId (getId cmd) ErrorC 1131 "Use 'elif' to start another branch." _ -> return () commentWarning id = parseProblemAtId id ErrorC 1127 "Was this intended as a comment? Use # in sh." makeSimpleCommand id1 id2 prefix cmd suffix = let (preAssigned, preRest) = partition assignment prefix (preRedirected, preRest2) = partition redirection preRest (postRedirected, postRest) = partition redirection suffix redirs = preRedirected ++ postRedirected assigns = preAssigned args = cmd ++ preRest2 ++ postRest in T_Redirecting id1 redirs $ T_SimpleCommand id2 assigns args where assignment (T_Assignment {}) = True assignment _ = False redirection (T_FdRedirect {}) = True redirection _ = False readSource :: Monad m => Token -> SCParser m Token readSource t@(T_Redirecting _ _ (T_SimpleCommand cmdId _ (cmd:file':rest'))) = do let file = getFile file' rest' override <- getSourceOverride let literalFile = do name <- override `mplus` getLiteralString file -- Hack to avoid 'source ~/foo' trying to read from literal tilde guard . not $ "~/" `isPrefixOf` name return name case literalFile of Nothing -> do parseNoteAtId (getId file) WarningC 1090 "Can't follow non-constant source. Use a directive to specify location." return t Just filename -> do proceed <- shouldFollow filename if not proceed then do -- FIXME: This actually gets squashed without -a parseNoteAtId (getId file) InfoC 1093 "This file appears to be recursively sourced. Ignoring." return t else do sys <- Mr.asks systemInterface (input, resolvedFile) <- if filename == "/dev/null" -- always allow /dev/null then return (Right "", filename) else do currentScript <- Mr.asks currentFilename paths <- mapMaybe getSourcePath <$> getCurrentAnnotations True resolved <- system $ siFindSource sys currentScript paths filename contents <- system $ siReadFile sys resolved return (contents, resolved) case input of Left err -> do parseNoteAtId (getId file) InfoC 1091 $ "Not following: " ++ err return t Right script -> do id1 <- getNewIdFor cmdId id2 <- getNewIdFor cmdId let included = do src <- subRead resolvedFile script return $ T_SourceCommand id1 t (T_Include id2 src) let failed = do parseNoteAtId (getId file) WarningC 1094 "Parsing of sourced file failed. Ignoring it." return t included <|> failed where getFile :: Token -> [Token] -> Token getFile file (next:rest) = case getLiteralString file of Just "--" -> next x -> file getFile file _ = file getSourcePath t = case t of SourcePath x -> Just x _ -> Nothing subRead name script = withContext (ContextSource name) $ inSeparateContext $ subParse (initialPos name) (readScriptFile True) script readSource t = return t prop_readPipeline = isOk readPipeline "! cat /etc/issue | grep -i ubuntu" prop_readPipeline2 = isWarning readPipeline "!cat /etc/issue | grep -i ubuntu" prop_readPipeline3 = isOk readPipeline "for f; do :; done|cat" readPipeline = do unexpecting "keyword/token" readKeyword do (T_Bang id) <- g_Bang pipe <- readPipeSequence return $ T_Banged id pipe <|> readPipeSequence prop_readAndOr = isOk readAndOr "grep -i lol foo || exit 1" prop_readAndOr1 = isOk readAndOr "# shellcheck disable=1\nfoo" prop_readAndOr2 = isOk readAndOr "# shellcheck disable=1\n# lol\n# shellcheck disable=3\nfoo" readAndOr = do start <- startSpan apos <- getPosition annotations <- readAnnotations aid <- endSpan start unless (null annotations) $ optional $ do try . lookAhead $ readKeyword parseProblemAt apos ErrorC 1123 "ShellCheck directives are only valid in front of complete compound commands, like 'if', not e.g. individual 'elif' branches." andOr <- withAnnotations annotations $ chainr1 readPipeline $ do op <- g_AND_IF <|> g_OR_IF readLineBreak return $ case op of T_AND_IF id -> T_AndIf id T_OR_IF id -> T_OrIf id return $ if null annotations then andOr else T_Annotation aid annotations andOr readTermOrNone = do allspacing readTerm <|> do eof return [] prop_readTerm = isOk readTerm "time ( foo; bar; )" readTerm = do allspacing m <- readAndOr readTerm' m where readTerm' current = do (sep, (start, end)) <- readSeparator id <- getNextIdBetween start end more <- option (T_EOF id) readAndOr case more of (T_EOF _) -> return [transformWithSeparator id sep current] _ -> do list <- readTerm' more return (transformWithSeparator id sep current : list) <|> return [current] where transformWithSeparator i '&' = T_Backgrounded i transformWithSeparator i _ = id readPipeSequence = do start <- startSpan (cmds, pipes) <- sepBy1WithSeparators readCommand (readPipe `thenSkip` (spacing >> readLineBreak)) id <- endSpan start spacing return $ T_Pipeline id pipes cmds where sepBy1WithSeparators p s = do let elems = p >>= \x -> return ([x], []) let seps = do separator <- s return $ \(a,b) (c,d) -> (a++c, b ++ d ++ [separator]) elems `chainl1` seps readPipe = do notFollowedBy2 g_OR_IF start <- startSpan char '|' qualifier <- string "&" <|> return "" id <- endSpan start spacing return $ T_Pipe id ('|':qualifier) readCommand = choice [ readCompoundCommand, readCoProc, readSimpleCommand ] readCmdName = do -- Ignore alias suppression optional . try $ do char '\\' lookAhead $ variableChars readCmdWord readCmdWord = do skipAnnotationAndWarn readNormalWord <* spacing -- Due to poor planning, annotations after commands isn't handled well. -- At the time this function is used, it's usually too late to skip -- comments, so you end up with a parse failure instead. skipAnnotationAndWarn = optional $ do try . lookAhead $ readAnnotationPrefix parseProblem ErrorC 1126 "Place shellcheck directives before commands, not after." readAnyComment prop_readIfClause = isOk readIfClause "if false; then foo; elif true; then stuff; more stuff; else cows; fi" prop_readIfClause2 = isWarning readIfClause "if false; then; echo oo; fi" prop_readIfClause3 = isWarning readIfClause "if false; then true; else; echo lol; fi" prop_readIfClause4 = isWarning readIfClause "if false; then true; else if true; then echo lol; fi; fi" prop_readIfClause5 = isOk readIfClause "if false; then true; else\nif true; then echo lol; fi; fi" readIfClause = called "if expression" $ do start <- startSpan pos <- getPosition (condition, action) <- readIfPart elifs <- many readElifPart elses <- option [] readElsePart g_Fi `orFail` do parseProblemAt pos ErrorC 1046 "Couldn't find 'fi' for this 'if'." parseProblem ErrorC 1047 "Expected 'fi' matching previously mentioned 'if'." return "Expected 'fi'" id <- endSpan start return $ T_IfExpression id ((condition, action):elifs) elses verifyNotEmptyIf s = optional (do emptyPos <- getPosition try . lookAhead $ (g_Fi <|> g_Elif <|> g_Else) parseProblemAt emptyPos ErrorC 1048 $ "Can't have empty " ++ s ++ " clauses (use 'true' as a no-op).") readIfPart = do pos <- getPosition g_If allspacing condition <- readTerm ifNextToken (g_Fi <|> g_Elif <|> g_Else) $ parseProblemAt pos ErrorC 1049 "Did you forget the 'then' for this 'if'?" called "then clause" $ do g_Then `orFail` do parseProblem ErrorC 1050 "Expected 'then'." return "Expected 'then'" acceptButWarn g_Semi ErrorC 1051 "Semicolons directly after 'then' are not allowed. Just remove it." allspacing verifyNotEmptyIf "then" action <- readTerm return (condition, action) readElifPart = called "elif clause" $ do pos <- getPosition g_Elif allspacing condition <- readTerm ifNextToken (g_Fi <|> g_Elif <|> g_Else) $ parseProblemAt pos ErrorC 1049 "Did you forget the 'then' for this 'elif'?" g_Then acceptButWarn g_Semi ErrorC 1052 "Semicolons directly after 'then' are not allowed. Just remove it." allspacing verifyNotEmptyIf "then" action <- readTerm return (condition, action) readElsePart = called "else clause" $ do pos <- getPosition g_Else optional $ do try . lookAhead $ g_If parseProblemAt pos ErrorC 1075 "Use 'elif' instead of 'else if' (or put 'if' on new line if nesting)." acceptButWarn g_Semi ErrorC 1053 "Semicolons directly after 'else' are not allowed. Just remove it." allspacing verifyNotEmptyIf "else" readTerm ifNextToken parser action = optional $ do try . lookAhead $ parser action prop_readSubshell = isOk readSubshell "( cd /foo; tar cf stuff.tar * )" readSubshell = called "explicit subshell" $ do start <- startSpan char '(' allspacing list <- readCompoundList allspacing char ')' <|> fail "Expected ) closing the subshell" id <- endSpan start return $ T_Subshell id list prop_readBraceGroup = isOk readBraceGroup "{ a; b | c | d; e; }" prop_readBraceGroup2 = isWarning readBraceGroup "{foo;}" prop_readBraceGroup3 = isOk readBraceGroup "{(foo)}" readBraceGroup = called "brace group" $ do start <- startSpan char '{' void allspacingOrFail <|> optional (do lookAhead $ noneOf "(" -- {( is legal parseProblem ErrorC 1054 "You need a space after the '{'.") optional $ do pos <- getPosition lookAhead $ char '}' parseProblemAt pos ErrorC 1055 "You need at least one command here. Use 'true;' as a no-op." list <- readTerm char '}' <|> do parseProblem ErrorC 1056 "Expected a '}'. If you have one, try a ; or \\n in front of it." fail "Missing '}'" id <- endSpan start return $ T_BraceGroup id list prop_readBatsTest = isOk readBatsTest "@test 'can parse' {\n true\n}" readBatsTest = called "bats @test" $ do start <- startSpan try $ string "@test" spacing name <- readNormalWord spacing test <- readBraceGroup id <- endSpan start return $ T_BatsTest id name test prop_readWhileClause = isOk readWhileClause "while [[ -e foo ]]; do sleep 1; done" readWhileClause = called "while loop" $ do start <- startSpan kwId <- getId <$> g_While condition <- readTerm statements <- readDoGroup kwId id <- endSpan start return $ T_WhileExpression id condition statements prop_readUntilClause = isOk readUntilClause "until kill -0 $PID; do sleep 1; done" readUntilClause = called "until loop" $ do start <- startSpan kwId <- getId <$> g_Until condition <- readTerm statements <- readDoGroup kwId id <- endSpan start return $ T_UntilExpression id condition statements readDoGroup kwId = do optional (do try . lookAhead $ g_Done parseProblemAtId kwId ErrorC 1057 "Did you forget the 'do' for this loop?") doKw <- g_Do `orFail` do parseProblem ErrorC 1058 "Expected 'do'." return "Expected 'do'" acceptButWarn g_Semi ErrorC 1059 "No semicolons directly after 'do'." allspacing optional (do try . lookAhead $ g_Done parseProblemAtId (getId doKw) ErrorC 1060 "Can't have empty do clauses (use 'true' as a no-op).") commands <- readCompoundList g_Done `orFail` do parseProblemAtId (getId doKw) ErrorC 1061 "Couldn't find 'done' for this 'do'." parseProblem ErrorC 1062 "Expected 'done' matching previously mentioned 'do'." return "Expected 'done'" return commands prop_readForClause = isOk readForClause "for f in *; do rm \"$f\"; done" prop_readForClause3 = isOk readForClause "for f; do foo; done" prop_readForClause4 = isOk readForClause "for((i=0; i<10; i++)); do echo $i; done" prop_readForClause5 = isOk readForClause "for ((i=0;i<10 && n>x;i++,--n))\ndo \necho $i\ndone" prop_readForClause6 = isOk readForClause "for ((;;))\ndo echo $i\ndone" prop_readForClause7 = isOk readForClause "for ((;;)) do echo $i\ndone" prop_readForClause8 = isOk readForClause "for ((;;)) ; do echo $i\ndone" prop_readForClause9 = isOk readForClause "for i do true; done" prop_readForClause10= isOk readForClause "for ((;;)) { true; }" prop_readForClause12= isWarning readForClause "for $a in *; do echo \"$a\"; done" prop_readForClause13= isOk readForClause "for foo\nin\\\n bar\\\n baz\ndo true; done" readForClause = called "for loop" $ do pos <- getPosition (T_For id) <- g_For spacing readArithmetic id <|> readRegular id where readArithmetic id = called "arithmetic for condition" $ do try $ string "((" x <- readArithmeticContents char ';' >> spacing y <- readArithmeticContents char ';' >> spacing z <- readArithmeticContents spacing string "))" spacing optional $ readSequentialSep >> spacing group <- readBraced <|> readDoGroup id return $ T_ForArithmetic id x y z group readBraced = do (T_BraceGroup _ list) <- readBraceGroup return list readRegular id = do acceptButWarn (char '$') ErrorC 1086 "Don't use $ on the iterator name in for loops." name <- readVariableName `thenSkip` allspacing values <- readInClause <|> (optional readSequentialSep >> return []) group <- readDoGroup id return $ T_ForIn id name values group prop_readSelectClause1 = isOk readSelectClause "select foo in *; do echo $foo; done" prop_readSelectClause2 = isOk readSelectClause "select foo; do echo $foo; done" readSelectClause = called "select loop" $ do (T_Select id) <- g_Select spacing typ <- readRegular group <- readDoGroup id typ id group where readRegular = do name <- readVariableName spacing values <- readInClause <|> (readSequentialSep >> return []) return $ \id group -> (return $ T_SelectIn id name values group) readInClause = do g_In things <- readCmdWord `reluctantlyTill` (void g_Semi <|> void linefeed <|> void g_Do) do { lookAhead g_Do; parseNote ErrorC 1063 "You need a line feed or semicolon before the 'do'."; } <|> do { optional g_Semi; void allspacing; } return things prop_readCaseClause = isOk readCaseClause "case foo in a ) lol; cow;; b|d) fooo; esac" prop_readCaseClause2 = isOk readCaseClause "case foo\n in * ) echo bar;; esac" prop_readCaseClause3 = isOk readCaseClause "case foo\n in * ) echo bar & ;; esac" prop_readCaseClause4 = isOk readCaseClause "case foo\n in *) echo bar ;& bar) foo; esac" prop_readCaseClause5 = isOk readCaseClause "case foo\n in *) echo bar;;& foo) baz;; esac" readCaseClause = called "case expression" $ do start <- startSpan g_Case word <- readNormalWord allspacing g_In <|> fail "Expected 'in'" readLineBreak list <- readCaseList g_Esac <|> fail "Expected 'esac' to close the case statement" id <- endSpan start return $ T_CaseExpression id word list readCaseList = many readCaseItem readCaseItem = called "case item" $ do notFollowedBy2 g_Esac optional $ do try . lookAhead $ readAnnotationPrefix parseProblem ErrorC 1124 "ShellCheck directives are only valid in front of complete commands like 'case' statements, not individual case branches." optional g_Lparen spacing pattern' <- readPattern void g_Rparen <|> do parseProblem ErrorC 1085 "Did you forget to move the ;; after extending this case item?" fail "Expected ) to open a new case item" readLineBreak list <- (lookAhead readCaseSeparator >> return []) <|> readCompoundList separator <- readCaseSeparator `attempting` do pos <- getPosition lookAhead g_Rparen parseProblemAt pos ErrorC 1074 "Did you forget the ;; after the previous case item?" readLineBreak return (separator, pattern', list) readCaseSeparator = choice [ tryToken ";;&" (const ()) >> return CaseContinue, tryToken ";&" (const ()) >> return CaseFallThrough, g_DSEMI >> return CaseBreak, lookAhead (readLineBreak >> g_Esac) >> return CaseBreak ] prop_readFunctionDefinition = isOk readFunctionDefinition "foo() { command foo --lol \"$@\"; }" prop_readFunctionDefinition1 = isOk readFunctionDefinition "foo (){ command foo --lol \"$@\"; }" prop_readFunctionDefinition4 = isWarning readFunctionDefinition "foo(a, b) { true; }" prop_readFunctionDefinition5 = isOk readFunctionDefinition ":(){ :|:;}" prop_readFunctionDefinition6 = isOk readFunctionDefinition "?(){ foo; }" prop_readFunctionDefinition7 = isOk readFunctionDefinition "..(){ cd ..; }" prop_readFunctionDefinition8 = isOk readFunctionDefinition "foo() (ls)" prop_readFunctionDefinition9 = isOk readFunctionDefinition "function foo { true; }" prop_readFunctionDefinition10= isOk readFunctionDefinition "function foo () { true; }" prop_readFunctionDefinition11= isWarning readFunctionDefinition "function foo{\ntrue\n}" prop_readFunctionDefinition12= isOk readFunctionDefinition "function []!() { true; }" prop_readFunctionDefinition13= isOk readFunctionDefinition "@require(){ true; }" readFunctionDefinition = called "function" $ do start <- startSpan functionSignature <- try readFunctionSignature allspacing void (lookAhead $ oneOf "{(") <|> parseProblem ErrorC 1064 "Expected a { to open the function definition." group <- readBraceGroup <|> readSubshell id <- endSpan start return $ functionSignature id group where readFunctionSignature = readWithFunction <|> readWithoutFunction where readWithFunction = do try $ do string "function" whitespace spacing name <- many1 extendedFunctionChars spaces <- spacing hasParens <- wasIncluded readParens when (not hasParens && null spaces) $ acceptButWarn (lookAhead (oneOf "{(")) ErrorC 1095 "You need a space or linefeed between the function name and body." return $ \id -> T_Function id (FunctionKeyword True) (FunctionParentheses hasParens) name readWithoutFunction = try $ do name <- many1 functionChars guard $ name /= "time" -- Interfers with time ( foo ) spacing readParens return $ \id -> T_Function id (FunctionKeyword False) (FunctionParentheses True) name readParens = do g_Lparen spacing g_Rparen <|> do parseProblem ErrorC 1065 "Trying to declare parameters? Don't. Use () and refer to params as $1, $2.." many $ noneOf "\n){" g_Rparen return () prop_readCoProc1 = isOk readCoProc "coproc foo { echo bar; }" prop_readCoProc2 = isOk readCoProc "coproc { echo bar; }" prop_readCoProc3 = isOk readCoProc "coproc echo bar" readCoProc = called "coproc" $ do start <- startSpan try $ do string "coproc" whitespace choice [ try $ readCompoundCoProc start, readSimpleCoProc start ] where readCompoundCoProc start = do var <- optionMaybe $ readVariableName `thenSkip` whitespace body <- readBody readCompoundCommand id <- endSpan start return $ T_CoProc id var body readSimpleCoProc start = do body <- readBody readSimpleCommand id <- endSpan start return $ T_CoProc id Nothing body readBody parser = do start <- startSpan body <- parser id <- endSpan start return $ T_CoProcBody id body readPattern = (readNormalWord `thenSkip` spacing) `sepBy1` (char '|' `thenSkip` spacing) prop_readCompoundCommand = isOk readCompoundCommand "{ echo foo; }>/dev/null" readCompoundCommand = do cmd <- choice [ readBraceGroup, readAmbiguous "((" readArithmeticExpression readSubshell (\pos -> parseNoteAt pos WarningC 1105 "Shells disambiguate (( differently or not at all. For subshell, add spaces around ( . For ((, fix parsing errors."), readSubshell, readCondition, readWhileClause, readUntilClause, readIfClause, readForClause, readSelectClause, readCaseClause, readBatsTest, readFunctionDefinition ] spacing redirs <- many readIoRedirect id <- getNextIdSpanningTokenList (cmd:redirs) unless (null redirs) $ optional $ do lookAhead $ try (spacing >> needsSeparator) parseProblem WarningC 1013 "Bash requires ; or \\n here, after redirecting nested compound commands." return $ T_Redirecting id redirs cmd where needsSeparator = choice [ g_Then, g_Else, g_Elif, g_Fi, g_Do, g_Done, g_Esac, g_Rbrace ] readCompoundList = readTerm readCompoundListOrEmpty = do allspacing readTerm <|> return [] readCmdPrefix = many1 (readIoRedirect <|> readAssignmentWord) readCmdSuffix = many1 (readIoRedirect <|> readCmdWord) readModifierSuffix = many1 (readIoRedirect <|> readWellFormedAssignment <|> readCmdWord) readTimeSuffix = do flags <- many readFlag pipeline <- readPipeline return $ flags ++ [pipeline] where -- This fails for quoted variables and such. Fixme? readFlag = do lookAhead $ char '-' readCmdWord -- Fixme: this is a hack that doesn't handle let c='4'"5" or let a\>b readLetSuffix :: Monad m => SCParser m [Token] readLetSuffix = many1 (readIoRedirect <|> try readLetExpression <|> readCmdWord) where readLetExpression :: Monad m => SCParser m Token readLetExpression = do startPos <- getPosition expression <- readStringForParser readCmdWord let (unQuoted, newPos) = kludgeAwayQuotes expression startPos subParse newPos readArithmeticContents unQuoted kludgeAwayQuotes :: String -> SourcePos -> (String, SourcePos) kludgeAwayQuotes s p = case s of first:rest@(_:_) -> let (last:backwards) = reverse rest middle = reverse backwards in if first `elem` "'\"" && first == last then (middle, updatePosChar p first) else (s, p) x -> (s, p) -- bash allows a=(b), ksh allows $a=(b). dash allows neither. Let's warn. readEvalSuffix = many1 (readIoRedirect <|> readCmdWord <|> evalFallback) where evalFallback = do pos <- getPosition lookAhead $ char '(' parseProblemAt pos WarningC 1098 "Quote/escape special characters when using eval, e.g. eval \"a=(b)\"." fail "Unexpected parentheses. Make sure to quote when eval'ing as shell parsers differ." -- Get whatever a parser would parse as a string readStringForParser parser = do pos <- inSeparateContext $ lookAhead (parser >> getPosition) readUntil pos where readUntil endPos = anyChar `reluctantlyTill` (getPosition >>= guard . (== endPos)) -- Like readStringForParser, returning the span as a T_Literal readLiteralForParser parser = do start <- startSpan str <- readStringForParser parser id <- endSpan start return $ T_Literal id str prop_readAssignmentWord = isOk readAssignmentWord "a=42" prop_readAssignmentWord2 = isOk readAssignmentWord "b=(1 2 3)" prop_readAssignmentWord3 = isWarning readAssignmentWord "$b = 13" prop_readAssignmentWord4 = isWarning readAssignmentWord "b = $(lol)" prop_readAssignmentWord5 = isOk readAssignmentWord "b+=lol" prop_readAssignmentWord6 = isWarning readAssignmentWord "b += (1 2 3)" prop_readAssignmentWord7 = isOk readAssignmentWord "a[3$n'']=42" prop_readAssignmentWord8 = isOk readAssignmentWord "a[4''$(cat foo)]=42" prop_readAssignmentWord9 = isOk readAssignmentWord "IFS= " prop_readAssignmentWord9a= isOk readAssignmentWord "foo=" prop_readAssignmentWord9b= isOk readAssignmentWord "foo= " prop_readAssignmentWord9c= isOk readAssignmentWord "foo= #bar" prop_readAssignmentWord10= isWarning readAssignmentWord "foo$n=42" prop_readAssignmentWord11= isOk readAssignmentWord "foo=([a]=b [c] [d]= [e f )" prop_readAssignmentWord12= isOk readAssignmentWord "a[b <<= 3 + c]='thing'" prop_readAssignmentWord13= isOk readAssignmentWord "var=( (1 2) (3 4) )" prop_readAssignmentWord14= isOk readAssignmentWord "var=( 1 [2]=(3 4) )" prop_readAssignmentWord15= isOk readAssignmentWord "var=(1 [2]=(3 4))" readAssignmentWord = readAssignmentWordExt True readWellFormedAssignment = readAssignmentWordExt False readAssignmentWordExt lenient = try $ do start <- startSpan pos <- getPosition when lenient $ optional (char '$' >> parseNote ErrorC 1066 "Don't use $ on the left side of assignments.") variable <- readVariableName when lenient $ optional (readNormalDollar >> parseNoteAt pos ErrorC 1067 "For indirection, use arrays, declare \"var$n=value\", or (for sh) read/eval.") indices <- many readArrayIndex hasLeftSpace <- fmap (not . null) spacing pos <- getPosition id <- endSpan start op <- readAssignmentOp hasRightSpace <- fmap (not . null) spacing isEndOfCommand <- fmap isJust $ optionMaybe (try . lookAhead $ (void (oneOf "\r\n;&|)") <|> eof)) if not hasLeftSpace && (hasRightSpace || isEndOfCommand) then do when (variable /= "IFS" && hasRightSpace && not isEndOfCommand) $ parseNoteAt pos WarningC 1007 "Remove space after = if trying to assign a value (for empty string, use var='' ... )." value <- readEmptyLiteral return $ T_Assignment id op variable indices value else do when (hasLeftSpace || hasRightSpace) $ parseNoteAt pos ErrorC 1068 $ "Don't put spaces around the " ++ (if op == Append then "+= when appending" else "= in assignments") ++ " (or quote to make it literal)." value <- readArray <|> readNormalWord spacing return $ T_Assignment id op variable indices value where readAssignmentOp = do pos <- getPosition unexpecting "" $ string "===" choice [ string "+=" >> return Append, do try (string "==") parseProblemAt pos ErrorC 1097 "Unexpected ==. For assignment, use =. For comparison, use [/[[." return Assign, string "=" >> return Assign ] readEmptyLiteral = do start <- startSpan id <- endSpan start return $ T_Literal id "" readArrayIndex = do start <- startSpan char '[' pos <- getPosition str <- readStringForParser readIndexSpan char ']' id <- endSpan start return $ T_UnparsedIndex id pos str readArray :: Monad m => SCParser m Token readArray = called "array assignment" $ do start <- startSpan opening <- getPosition char '(' optional $ do lookAhead $ char '(' parseProblemAt opening ErrorC 1116 "Missing $ on a $((..)) expression? (or use ( ( for arrays)." allspacing words <- readElement `reluctantlyTill` char ')' char ')' <|> fail "Expected ) to close array assignment" id <- endSpan start return $ T_Array id words where readElement = (readIndexed <|> readRegular) `thenSkip` allspacing readIndexed = do start <- startSpan index <- try $ do x <- many1 readArrayIndex char '=' return x value <- readRegular <|> nothing id <- endSpan start return $ T_IndexedElement id index value readRegular = readArray <|> readNormalWord nothing = do start <- startSpan id <- endSpan start return $ T_Literal id "" tryToken s t = try $ do start <- startSpan string s id <- endSpan start spacing return $ t id redirToken c t = try $ do start <- startSpan char c id <- endSpan start notFollowedBy2 $ char '(' return $ t id tryWordToken s t = tryParseWordToken s t `thenSkip` spacing tryParseWordToken keyword t = try $ do start <- startSpan str <- anycaseString keyword id <- endSpan start optional $ do c <- try . lookAhead $ anyChar let warning code = parseProblem ErrorC code $ "You need a space before the " ++ [c] ++ "." case c of '[' -> warning 1069 '#' -> warning 1099 '!' -> warning 1129 ':' -> warning 1130 _ -> return () lookAhead keywordSeparator when (str /= keyword) $ parseProblem ErrorC 1081 $ "Scripts are case sensitive. Use '" ++ keyword ++ "', not '" ++ str ++ "'." return $ t id anycaseString = mapM anycaseChar where anycaseChar c = char (toLower c) <|> char (toUpper c) g_AND_IF = tryToken "&&" T_AND_IF g_OR_IF = tryToken "||" T_OR_IF g_DSEMI = tryToken ";;" T_DSEMI g_DLESS = tryToken "<<" T_DLESS g_DGREAT = tryToken ">>" T_DGREAT g_LESSAND = tryToken "<&" T_LESSAND g_GREATAND = tryToken ">&" T_GREATAND g_LESSGREAT = tryToken "<>" T_LESSGREAT g_DLESSDASH = tryToken "<<-" T_DLESSDASH g_CLOBBER = tryToken ">|" T_CLOBBER g_OPERATOR = g_AND_IF <|> g_OR_IF <|> g_DSEMI <|> g_DLESSDASH <|> g_DLESS <|> g_DGREAT <|> g_LESSAND <|> g_GREATAND <|> g_LESSGREAT g_If = tryWordToken "if" T_If g_Then = tryWordToken "then" T_Then g_Else = tryWordToken "else" T_Else g_Elif = tryWordToken "elif" T_Elif g_Fi = tryWordToken "fi" T_Fi g_Do = tryWordToken "do" T_Do g_Done = tryWordToken "done" T_Done g_Case = tryWordToken "case" T_Case g_Esac = tryWordToken "esac" T_Esac g_While = tryWordToken "while" T_While g_Until = tryWordToken "until" T_Until g_For = tryWordToken "for" T_For g_Select = tryWordToken "select" T_Select g_In = tryWordToken "in" T_In <* skipAnnotationAndWarn g_Lbrace = tryWordToken "{" T_Lbrace g_Rbrace = do -- handled specially due to ksh echo "${ foo; }bar" start <- startSpan char '}' id <- endSpan start return $ T_Rbrace id g_Lparen = tryToken "(" T_Lparen g_Rparen = tryToken ")" T_Rparen g_Bang = do start <- startSpan char '!' id <- endSpan start void spacing1 <|> do pos <- getPosition parseProblemAt pos ErrorC 1035 "You are missing a required space after the !." return $ T_Bang id g_Semi = do notFollowedBy2 g_DSEMI tryToken ";" T_Semi keywordSeparator = eof <|> void (try allspacingOrFail) <|> void (oneOf ";()[<>&|") readKeyword = choice [ g_Then, g_Else, g_Elif, g_Fi, g_Do, g_Done, g_Esac, g_Rbrace, g_Rparen, g_DSEMI ] ifParse p t f = (lookAhead (try p) >> t) <|> f prop_readShebang1 = isOk readShebang "#!/bin/sh\n" prop_readShebang2 = isWarning readShebang "!# /bin/sh\n" prop_readShebang3 = isNotOk readShebang "#shellcheck shell=/bin/sh\n" prop_readShebang4 = isWarning readShebang "! /bin/sh" prop_readShebang5 = isWarning readShebang "\n#!/bin/sh" prop_readShebang6 = isWarning readShebang " # Copyright \n!#/bin/bash" prop_readShebang7 = isNotOk readShebang "# Copyright \nfoo\n#!/bin/bash" readShebang = do start <- startSpan anyShebang <|> try readMissingBang <|> withHeader many linewhitespace str <- many $ noneOf "\r\n" id <- endSpan start optional carriageReturn optional linefeed return $ T_Literal id str where anyShebang = choice $ map try [ readCorrect, readSwapped, readTooManySpaces, readMissingHash ] readCorrect = void $ string "#!" readSwapped = do start <- startSpan string "!#" id <- endSpan start parseProblemAtId id ErrorC 1084 "Use #!, not !#, for the shebang." skipSpaces = fmap (not . null) $ many linewhitespace readTooManySpaces = do startPos <- getPosition startSpaces <- skipSpaces char '#' middlePos <- getPosition middleSpaces <- skipSpaces char '!' when startSpaces $ parseProblemAt startPos ErrorC 1114 "Remove leading spaces before the shebang." when middleSpaces $ parseProblemAt middlePos ErrorC 1115 "Remove spaces between # and ! in the shebang." readMissingHash = do pos <- getPosition char '!' ensurePathAhead parseProblemAt pos ErrorC 1104 "Use #!, not just !, for the shebang." readMissingBang = do char '#' pos <- getPosition ensurePathAhead parseProblemAt pos ErrorC 1113 "Use #!, not just #, for the shebang." ensurePathAhead = lookAhead $ do many linewhitespace char '/' withHeader = try $ do many1 headerLine pos <- getPosition anyShebang <* parseProblemAt pos ErrorC 1128 "The shebang must be on the first line. Delete blanks and move comments." headerLine = do notFollowedBy2 anyShebang many linewhitespace optional readAnyComment linefeed verifyEof = eof <|> choice [ ifParsable g_Lparen $ parseProblem ErrorC 1088 "Parsing stopped here. Invalid use of parentheses?", ifParsable readKeyword $ parseProblem ErrorC 1089 "Parsing stopped here. Is this keyword correctly matched up?", parseProblem ErrorC 1070 "Parsing stopped here. Mismatched keywords or invalid parentheses?" ] where ifParsable p action = do try (lookAhead p) action readConfigFile :: Monad m => FilePath -> SCParser m [Annotation] readConfigFile filename = do shouldIgnore <- Mr.asks ignoreRC if shouldIgnore then return [] else read' filename where read' filename = do sys <- Mr.asks systemInterface contents <- system $ siGetConfig sys filename case contents of Nothing -> return [] Just (file, str) -> readConfig file str readConfig filename contents = do result <- lift $ runParserT readConfigKVs initialUserState filename contents case result of Right result -> return result Left err -> do parseProblem ErrorC 1134 $ errorFor filename err return [] errorFor filename err = let line = "line " ++ (show . sourceLine $ errorPos err) suggestion = getStringFromParsec $ errorMessages err in "Failed to process " ++ filename ++ ", " ++ line ++ ": " ++ suggestion prop_readConfigKVs1 = isOk readConfigKVs "disable=1234" prop_readConfigKVs2 = isOk readConfigKVs "# Comment\ndisable=1234 # Comment\n" prop_readConfigKVs3 = isOk readConfigKVs "" prop_readConfigKVs4 = isOk readConfigKVs "\n\n\n\n\t \n" prop_readConfigKVs5 = isOk readConfigKVs "# shellcheck accepts annotation-like comments in rc files\ndisable=1234" readConfigKVs = do anySpacingOrComment annotations <- many (readAnnotationWithoutPrefix <* anySpacingOrComment) eof return $ concat annotations anySpacingOrComment = many (void allspacingOrFail <|> void readAnyComment) prop_readScript1 = isOk readScript "#!/bin/bash\necho hello world\n" prop_readScript2 = isWarning readScript "#!/bin/bash\r\necho hello world\n" prop_readScript3 = isWarning readScript "#!/bin/bash\necho hello\xA0world" prop_readScript4 = isWarning readScript "#!/usr/bin/perl\nfoo=(" prop_readScript5 = isOk readScript "#!/bin/bash\n#This is an empty script\n\n" readScriptFile sourced = do start <- startSpan pos <- getPosition optional $ do readUtf8Bom parseProblem ErrorC 1082 "This file has a UTF-8 BOM. Remove it with: LC_CTYPE=C sed '1s/^...//' < yourscript ." shebang <- readShebang <|> readEmptyLiteral let (T_Literal _ shebangString) = shebang allspacing annotationStart <- startSpan fileAnnotations <- readAnnotations rcAnnotations <- if sourced then return [] else do filename <- Mr.asks currentFilename readConfigFile filename let annotations = fileAnnotations ++ rcAnnotations annotationId <- endSpan annotationStart let shellAnnotationSpecified = any (\x -> case x of ShellOverride {} -> True; _ -> False) annotations shellFlagSpecified <- isJust <$> Mr.asks shellTypeOverride let ignoreShebang = shellAnnotationSpecified || shellFlagSpecified unless ignoreShebang $ verifyShebang pos (getShell shebangString) if ignoreShebang || isValidShell (getShell shebangString) /= Just False then do commands <- withAnnotations annotations readCompoundListOrEmpty id <- endSpan start verifyEof let script = T_Annotation annotationId annotations $ T_Script id shebang commands reparseIndices script else do many anyChar id <- endSpan start return $ T_Script id shebang [] where basename s = reverse . takeWhile (/= '/') . reverse $ s getShell sb = case words sb of [] -> "" [x] -> basename x (first:second:_) -> if basename first == "env" then second else basename first verifyShebang pos s = do case isValidShell s of Just True -> return () Just False -> parseProblemAt pos ErrorC 1071 "ShellCheck only supports sh/bash/dash/ksh scripts. Sorry!" Nothing -> parseProblemAt pos ErrorC 1008 "This shebang was unrecognized. ShellCheck only supports sh/bash/dash/ksh. Add a 'shell' directive to specify." isValidShell s = let good = s == "" || any (`isPrefixOf` s) goodShells bad = any (`isPrefixOf` s) badShells in if good then Just True else if bad then Just False else Nothing goodShells = [ "sh", "ash", "dash", "bash", "bats", "ksh" ] badShells = [ "awk", "csh", "expect", "perl", "python", "ruby", "tcsh", "zsh" ] readUtf8Bom = called "Byte Order Mark" $ string "\xFEFF" readScript = readScriptFile False -- Interactively run a specific parser in ghci: -- debugParse readSimpleCommand "echo 'hello world'" debugParse p string = runIdentity $ do (res, _) <- runParser testEnvironment p "-" string return res -- Interactively run the complete parser in ghci: -- debugParseScript "#!/bin/bash\necho 'Hello World'\n" debugParseScript string = result { -- Remove the noisiest parts prTokenPositions = Map.fromList [ (Id 0, (newPosition { posFile = "removed for clarity", posLine = -1, posColumn = -1 }, newPosition { posFile = "removed for clarity", posLine = -1, posColumn = -1 }))] } where result = runIdentity $ parseScript (mockedSystemInterface []) $ newParseSpec { psFilename = "debug", psScript = string } testEnvironment = Environment { systemInterface = (mockedSystemInterface []), checkSourced = False, currentFilename = "myscript", ignoreRC = False, shellTypeOverride = Nothing } isOk p s = parsesCleanly p s == Just True -- The string parses with no warnings isWarning p s = parsesCleanly p s == Just False -- The string parses with warnings isNotOk p s = parsesCleanly p s == Nothing -- The string does not parse parsesCleanly parser string = runIdentity $ do (res, sys) <- runParser testEnvironment (parser >> eof >> getState) "-" string case (res, sys) of (Right userState, systemState) -> return $ Just . null $ parseNotes userState ++ parseProblems systemState (Left _, _) -> return Nothing -- For printf debugging: print the value of an expression -- Example: return $ dump $ T_Literal id [c] dump :: Show a => a -> a dump x = trace (show x) x -- Like above, but print a specific expression: -- Example: return $ dumps ("Returning: " ++ [c]) $ T_Literal id [c] dumps :: Show x => x -> a -> a dumps t = trace (show t) parseWithNotes parser = do item <- parser state <- getState return (item, state) compareNotes (ParseNote pos1 pos1' level1 _ s1) (ParseNote pos2 pos2' level2 _ s2) = compare (pos1, pos1', level1) (pos2, pos2', level2) sortNotes = sortBy compareNotes makeErrorFor parsecError = ParseNote pos pos ErrorC 1072 $ getStringFromParsec $ errorMessages parsecError where pos = errorPos parsecError getStringFromParsec errors = case map f errors of r -> unwords (take 1 $ catMaybes $ reverse r) ++ " Fix any mentioned problems and try again." where f err = case err of UnExpect s -> Nothing -- Due to not knowing Parsec, none of these SysUnExpect s -> Nothing -- are actually helpful. has been hidden Expect s -> Nothing -- and we only show explicit fail statements. Message s -> if null s then Nothing else return $ s ++ "." runParser :: Monad m => Environment m -> SCParser m v -> String -> String -> m (Either ParseError v, SystemState) runParser env p filename contents = Ms.runStateT (Mr.runReaderT (runParserT p initialUserState filename contents) env) initialSystemState system = lift . lift . lift parseShell env name contents = do (result, state) <- runParser env (parseWithNotes readScript) name contents case result of Right (script, userstate) -> return newParseResult { prComments = map toPositionedComment $ nub $ parseNotes userstate ++ parseProblems state, prTokenPositions = Map.map startEndPosToPos (positionMap userstate), prRoot = Just $ reattachHereDocs script (hereDocMap userstate) } Left err -> return newParseResult { prComments = map toPositionedComment $ notesForContext (contextStack state) ++ [makeErrorFor err] ++ parseProblems state, prTokenPositions = Map.empty, prRoot = Nothing } notesForContext list = zipWith ($) [first, second] $ filter isName list where isName (ContextName _ _) = True isName _ = False first (ContextName pos str) = ParseNote pos pos ErrorC 1073 $ "Couldn't parse this " ++ str ++ ". Fix to allow more checks." second (ContextName pos str) = ParseNote pos pos InfoC 1009 $ "The mentioned syntax error was in this " ++ str ++ "." -- Go over all T_UnparsedIndex and reparse them as either arithmetic or text -- depending on declare -A statements. reparseIndices root = analyze blank blank f root where associative = getAssociativeArrays root isAssociative s = s `elem` associative f (T_Assignment id mode name indices value) = do newIndices <- mapM (fixAssignmentIndex name) indices newValue <- case value of (T_Array id2 words) -> do newWords <- mapM (fixIndexElement name) words return $ T_Array id2 newWords x -> return x return $ T_Assignment id mode name newIndices newValue f (TA_Variable id name indices) = do newIndices <- mapM (fixAssignmentIndex name) indices return $ TA_Variable id name newIndices f t = return t fixIndexElement name word = case word of T_IndexedElement id indices value -> do new <- mapM (fixAssignmentIndex name) indices return $ T_IndexedElement id new value _ -> return word fixAssignmentIndex name word = case word of T_UnparsedIndex id pos src -> parsed name pos src _ -> return word parsed name pos src = if isAssociative name then subParse pos (called "associative array index" $ readIndexSpan) src else subParse pos (called "arithmetic array index expression" $ optional space >> readArithmeticContents) src reattachHereDocs root map = doTransform f root where f t@(T_HereDoc id dash quote string []) = fromMaybe t $ do list <- Map.lookup id map return $ T_HereDoc id dash quote string list f t = t toPositionedComment :: ParseNote -> PositionedComment toPositionedComment (ParseNote start end severity code message) = newPositionedComment { pcStartPos = (posToPos start) , pcEndPos = (posToPos end) , pcComment = newComment { cSeverity = severity , cCode = code , cMessage = message } } posToPos :: SourcePos -> Position posToPos sp = newPosition { posFile = sourceName sp, posLine = fromIntegral $ sourceLine sp, posColumn = fromIntegral $ sourceColumn sp } startEndPosToPos :: (SourcePos, SourcePos) -> (Position, Position) startEndPosToPos (s, e) = (posToPos s, posToPos e) -- TODO: Clean up crusty old code that this is layered on top of parseScript :: Monad m => SystemInterface m -> ParseSpec -> m ParseResult parseScript sys spec = parseShell env (psFilename spec) (psScript spec) where env = Environment { systemInterface = sys, checkSourced = psCheckSourced spec, currentFilename = psFilename spec, ignoreRC = psIgnoreRC spec, shellTypeOverride = psShellTypeOverride spec } -- Same as 'try' but emit syntax errors if the parse fails. tryWithErrors :: Monad m => SCParser m v -> SCParser m v tryWithErrors parser = do userstate <- getState oldContext <- getCurrentContexts input <- getInput pos <- getPosition result <- lift $ runParserT (setPosition pos >> getResult parser) userstate (sourceName pos) input case result of Right (result, endPos, endInput, endState) -> do -- 'many' objects if we don't consume anything at all, so read a dummy value void anyChar <|> eof putState endState setPosition endPos setInput endInput return result Left err -> do newContext <- getCurrentContexts addParseProblem $ makeErrorFor err mapM_ addParseProblem $ notesForContext newContext setCurrentContexts oldContext fail "" where getResult p = do result <- p endPos <- getPosition endInput <- getInput endState <- getState return (result, endPos, endInput, endState) return [] runTests = $quickCheckAll ShellCheck-0.7.0/src/ShellCheck/Regex.hs0000644000000000000000000000513313517444075016127 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE FlexibleContexts #-} -- Basically Text.Regex based on regex-tdfa instead of the buggy regex-posix. module ShellCheck.Regex where import Data.List import Data.Maybe import Control.Monad import Text.Regex.TDFA -- Precompile the regex mkRegex :: String -> Regex mkRegex str = let make :: String -> Regex make = makeRegex in make str -- Does the regex match? matches :: String -> Regex -> Bool matches = flip match -- Get all subgroups of the first match matchRegex :: Regex -> String -> Maybe [String] matchRegex re str = do (_, _, _, groups) <- matchM re str :: Maybe (String,String,String,[String]) return groups -- Get all full matches matchAllStrings :: Regex -> String -> [String] matchAllStrings re = unfoldr f where f :: String -> Maybe (String, String) f str = do (_, match, rest, _) <- matchM re str :: Maybe (String, String, String, [String]) return (match, rest) -- Get all subgroups from all matches matchAllSubgroups :: Regex -> String -> [[String]] matchAllSubgroups re = unfoldr f where f :: String -> Maybe ([String], String) f str = do (_, _, rest, groups) <- matchM re str :: Maybe (String, String, String, [String]) return (groups, rest) -- Replace regex in input with string subRegex :: Regex -> String -> String -> String subRegex re input replacement = f input where f str = fromMaybe str $ do (before, match, after) <- matchM re str :: Maybe (String, String, String) when (null match) $ error ("Internal error: substituted empty in " ++ str) return $ before ++ replacement ++ f after -- Split a string based on a regex. splitOn :: String -> Regex -> [String] splitOn input re = case matchM re input :: Maybe (String, String, String) of Just (before, match, after) -> before : after `splitOn` re Nothing -> [input] ShellCheck-0.7.0/src/ShellCheck/Checks/0000755000000000000000000000000013517444075015717 5ustar0000000000000000ShellCheck-0.7.0/src/ShellCheck/Checks/Commands.hs0000644000000000000000000014337513517444075020031 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} {-# LANGUAGE FlexibleContexts #-} -- This module contains checks that examine specific commands by name. module ShellCheck.Checks.Commands (checker , ShellCheck.Checks.Commands.runTests) where import ShellCheck.AST import ShellCheck.ASTLib import ShellCheck.AnalyzerLib import ShellCheck.Data import ShellCheck.Interface import ShellCheck.Parser import ShellCheck.Regex import Control.Monad import Control.Monad.RWS import Data.Char import Data.List import Data.Maybe import qualified Data.Map.Strict as Map import Test.QuickCheck.All (forAllProperties) import Test.QuickCheck.Test (quickCheckWithResult, stdArgs, maxSuccess) data CommandName = Exactly String | Basename String deriving (Eq, Ord) data CommandCheck = CommandCheck CommandName (Token -> Analysis) verify :: CommandCheck -> String -> Bool verify f s = producesComments (getChecker [f]) s == Just True verifyNot f s = producesComments (getChecker [f]) s == Just False arguments (T_SimpleCommand _ _ (cmd:args)) = args commandChecks :: [CommandCheck] commandChecks = [ checkTr ,checkFindNameGlob ,checkNeedlessExpr ,checkGrepRe ,checkTrapQuotes ,checkReturn ,checkExit ,checkFindExecWithSingleArgument ,checkUnusedEchoEscapes ,checkInjectableFindSh ,checkFindActionPrecedence ,checkMkdirDashPM ,checkNonportableSignals ,checkInteractiveSu ,checkSshCommandString ,checkPrintfVar ,checkUuoeCmd ,checkSetAssignment ,checkExportedExpansions ,checkAliasesUsesArgs ,checkAliasesExpandEarly ,checkUnsetGlobs ,checkFindWithoutPath ,checkTimeParameters ,checkTimedCommand ,checkLocalScope ,checkDeprecatedTempfile ,checkDeprecatedEgrep ,checkDeprecatedFgrep ,checkWhileGetoptsCase ,checkCatastrophicRm ,checkLetUsage ,checkMvArguments, checkCpArguments, checkLnArguments ,checkFindRedirections ,checkReadExpansions ,checkWhich ,checkSudoRedirect ,checkSudoArgs ,checkSourceArgs ,checkChmodDashr ] buildCommandMap :: [CommandCheck] -> Map.Map CommandName (Token -> Analysis) buildCommandMap = foldl' addCheck Map.empty where addCheck map (CommandCheck name function) = Map.insertWith composeAnalyzers name function map checkCommand :: Map.Map CommandName (Token -> Analysis) -> Token -> Analysis checkCommand map t@(T_SimpleCommand id _ (cmd:rest)) = fromMaybe (return ()) $ do name <- getLiteralString cmd return $ if '/' `elem` name then Map.findWithDefault nullCheck (Basename $ basename name) map t else do Map.findWithDefault nullCheck (Exactly name) map t Map.findWithDefault nullCheck (Basename name) map t where basename = reverse . takeWhile (/= '/') . reverse checkCommand _ _ = return () getChecker :: [CommandCheck] -> Checker getChecker list = Checker { perScript = const $ return (), perToken = checkCommand map } where map = buildCommandMap list checker :: Parameters -> Checker checker params = getChecker commandChecks prop_checkTr1 = verify checkTr "tr [a-f] [A-F]" prop_checkTr2 = verify checkTr "tr 'a-z' 'A-Z'" prop_checkTr2a= verify checkTr "tr '[a-z]' '[A-Z]'" prop_checkTr3 = verifyNot checkTr "tr -d '[:lower:]'" prop_checkTr3a= verifyNot checkTr "tr -d '[:upper:]'" prop_checkTr3b= verifyNot checkTr "tr -d '|/_[:upper:]'" prop_checkTr4 = verifyNot checkTr "ls [a-z]" prop_checkTr5 = verify checkTr "tr foo bar" prop_checkTr6 = verify checkTr "tr 'hello' 'world'" prop_checkTr8 = verifyNot checkTr "tr aeiou _____" prop_checkTr9 = verifyNot checkTr "a-z n-za-m" prop_checkTr10= verifyNot checkTr "tr --squeeze-repeats rl lr" prop_checkTr11= verifyNot checkTr "tr abc '[d*]'" prop_checkTr12= verifyNot checkTr "tr '[=e=]' 'e'" checkTr = CommandCheck (Basename "tr") (mapM_ f . arguments) where f w | isGlob w = -- The user will go [ab] -> '[ab]' -> 'ab'. Fixme? warn (getId w) 2060 "Quote parameters to tr to prevent glob expansion." f word = case getLiteralString word of Just "a-z" -> info (getId word) 2018 "Use '[:lower:]' to support accents and foreign alphabets." Just "A-Z" -> info (getId word) 2019 "Use '[:upper:]' to support accents and foreign alphabets." Just s -> do -- Eliminate false positives by only looking for dupes in SET2? when (not ("-" `isPrefixOf` s || "[:" `isInfixOf` s) && duplicated s) $ info (getId word) 2020 "tr replaces sets of chars, not words (mentioned due to duplicates)." unless ("[:" `isPrefixOf` s || "[=" `isPrefixOf` s) $ when ("[" `isPrefixOf` s && "]" `isSuffixOf` s && (length s > 2) && ('*' `notElem` s)) $ info (getId word) 2021 "Don't use [] around classes in tr, it replaces literal square brackets." Nothing -> return () duplicated s = let relevant = filter isAlpha s in relevant /= nub relevant prop_checkFindNameGlob1 = verify checkFindNameGlob "find / -name *.php" prop_checkFindNameGlob2 = verify checkFindNameGlob "find / -type f -ipath *(foo)" prop_checkFindNameGlob3 = verifyNot checkFindNameGlob "find * -name '*.php'" checkFindNameGlob = CommandCheck (Basename "find") (f . arguments) where acceptsGlob (Just s) = s `elem` [ "-ilname", "-iname", "-ipath", "-iregex", "-iwholename", "-lname", "-name", "-path", "-regex", "-wholename" ] acceptsGlob _ = False f [] = return () f [x] = return () f (a:b:r) = do when (acceptsGlob (getLiteralString a) && isGlob b) $ do let (Just s) = getLiteralString a warn (getId b) 2061 $ "Quote the parameter to " ++ s ++ " so the shell won't interpret it." f (b:r) prop_checkNeedlessExpr = verify checkNeedlessExpr "foo=$(expr 3 + 2)" prop_checkNeedlessExpr2 = verify checkNeedlessExpr "foo=`echo \\`expr 3 + 2\\``" prop_checkNeedlessExpr3 = verifyNot checkNeedlessExpr "foo=$(expr foo : regex)" prop_checkNeedlessExpr4 = verifyNot checkNeedlessExpr "foo=$(expr foo \\< regex)" checkNeedlessExpr = CommandCheck (Basename "expr") f where f t = when (all (`notElem` exceptions) (words $ arguments t)) $ style (getId $ getCommandTokenOrThis t) 2003 "expr is antiquated. Consider rewriting this using $((..)), ${} or [[ ]]." -- These operators are hard to replicate in POSIX exceptions = [ ":", "<", ">", "<=", ">=" ] words = mapMaybe getLiteralString prop_checkGrepRe1 = verify checkGrepRe "cat foo | grep *.mp3" prop_checkGrepRe2 = verify checkGrepRe "grep -Ev cow*test *.mp3" prop_checkGrepRe3 = verify checkGrepRe "grep --regex=*.mp3 file" prop_checkGrepRe4 = verifyNot checkGrepRe "grep foo *.mp3" prop_checkGrepRe5 = verifyNot checkGrepRe "grep-v --regex=moo *" prop_checkGrepRe6 = verifyNot checkGrepRe "grep foo \\*.mp3" prop_checkGrepRe7 = verify checkGrepRe "grep *foo* file" prop_checkGrepRe8 = verify checkGrepRe "ls | grep foo*.jpg" prop_checkGrepRe9 = verifyNot checkGrepRe "grep '[0-9]*' file" prop_checkGrepRe10= verifyNot checkGrepRe "grep '^aa*' file" prop_checkGrepRe11= verifyNot checkGrepRe "grep --include=*.png foo" prop_checkGrepRe12= verifyNot checkGrepRe "grep -F 'Foo*' file" prop_checkGrepRe13= verifyNot checkGrepRe "grep -- -foo bar*" prop_checkGrepRe14= verifyNot checkGrepRe "grep -e -foo bar*" prop_checkGrepRe15= verifyNot checkGrepRe "grep --regex -foo bar*" prop_checkGrepRe16= verifyNot checkGrepRe "grep --include 'Foo*' file" prop_checkGrepRe17= verifyNot checkGrepRe "grep --exclude 'Foo*' file" prop_checkGrepRe18= verifyNot checkGrepRe "grep --exclude-dir 'Foo*' file" prop_checkGrepRe19= verify checkGrepRe "grep -- 'Foo*' file" prop_checkGrepRe20= verifyNot checkGrepRe "grep --fixed-strings 'Foo*' file" prop_checkGrepRe21= verifyNot checkGrepRe "grep -o 'x*' file" prop_checkGrepRe22= verifyNot checkGrepRe "grep --only-matching 'x*' file" prop_checkGrepRe23= verifyNot checkGrepRe "grep '.*' file" checkGrepRe = CommandCheck (Basename "grep") check where check cmd = f cmd (arguments cmd) -- --regex=*(extglob) doesn't work. Fixme? skippable (Just s) = not ("--regex=" `isPrefixOf` s) && "-" `isPrefixOf` s skippable _ = False f _ [] = return () f cmd (x:r) = let str = getLiteralStringExt (const $ return "_") x in if str `elem` [Just "--", Just "-e", Just "--regex"] then checkRE cmd r -- Regex is *after* this else if skippable str then f cmd r -- Regex is elsewhere else checkRE cmd (x:r) -- Regex is this checkRE _ [] = return () checkRE cmd (re:_) = do when (isGlob re) $ warn (getId re) 2062 "Quote the grep pattern so the shell won't interpret it." unless (any (`elem` flags) grepGlobFlags) $ do let string = concat $ oversimplify re if isConfusedGlobRegex string then warn (getId re) 2063 "Grep uses regex, but this looks like a glob." else potentially $ do char <- getSuspiciousRegexWildcard string return $ info (getId re) 2022 $ "Note that unlike globs, " ++ [char] ++ "* here matches '" ++ [char, char, char] ++ "' but not '" ++ wordStartingWith char ++ "'." where flags = map snd $ getAllFlags cmd grepGlobFlags = ["fixed-strings", "F", "include", "exclude", "exclude-dir", "o", "only-matching"] wordStartingWith c = head . filter ([c] `isPrefixOf`) $ candidates where candidates = sampleWords ++ map (\(x:r) -> toUpper x : r) sampleWords ++ [c:"test"] getSuspiciousRegexWildcard str = if not $ str `matches` contra then do match <- matchRegex suspicious str str <- match !!! 0 str !!! 0 else fail "looks good" where suspicious = mkRegex "([A-Za-z1-9])\\*" contra = mkRegex "[^a-zA-Z1-9]\\*|[][^$+\\\\]" prop_checkTrapQuotes1 = verify checkTrapQuotes "trap \"echo $num\" INT" prop_checkTrapQuotes1a= verify checkTrapQuotes "trap \"echo `ls`\" INT" prop_checkTrapQuotes2 = verifyNot checkTrapQuotes "trap 'echo $num' INT" prop_checkTrapQuotes3 = verify checkTrapQuotes "trap \"echo $((1+num))\" EXIT DEBUG" checkTrapQuotes = CommandCheck (Exactly "trap") (f . arguments) where f (x:_) = checkTrap x f _ = return () checkTrap (T_NormalWord _ [T_DoubleQuoted _ rs]) = mapM_ checkExpansions rs checkTrap _ = return () warning id = warn id 2064 "Use single quotes, otherwise this expands now rather than when signalled." checkExpansions (T_DollarExpansion id _) = warning id checkExpansions (T_Backticked id _) = warning id checkExpansions (T_DollarBraced id _ _) = warning id checkExpansions (T_DollarArithmetic id _) = warning id checkExpansions _ = return () prop_checkReturn1 = verifyNot checkReturn "return" prop_checkReturn2 = verifyNot checkReturn "return 1" prop_checkReturn3 = verifyNot checkReturn "return $var" prop_checkReturn4 = verifyNot checkReturn "return $((a|b))" prop_checkReturn5 = verify checkReturn "return -1" prop_checkReturn6 = verify checkReturn "return 1000" prop_checkReturn7 = verify checkReturn "return 'hello world'" checkReturn = CommandCheck (Exactly "return") (returnOrExit (\c -> err c 2151 "Only one integer 0-255 can be returned. Use stdout for other data.") (\c -> err c 2152 "Can only return 0-255. Other data should be written to stdout.")) prop_checkExit1 = verifyNot checkExit "exit" prop_checkExit2 = verifyNot checkExit "exit 1" prop_checkExit3 = verifyNot checkExit "exit $var" prop_checkExit4 = verifyNot checkExit "exit $((a|b))" prop_checkExit5 = verify checkExit "exit -1" prop_checkExit6 = verify checkExit "exit 1000" prop_checkExit7 = verify checkExit "exit 'hello world'" checkExit = CommandCheck (Exactly "exit") (returnOrExit (\c -> err c 2241 "The exit status can only be one integer 0-255. Use stdout for other data.") (\c -> err c 2242 "Can only exit with status 0-255. Other data should be written to stdout/stderr.")) returnOrExit multi invalid = (f . arguments) where f (first:second:_) = multi (getId first) f [value] = when (isInvalid $ literal value) $ invalid (getId value) f _ = return () isInvalid s = s == "" || any (not . isDigit) s || length s > 5 || let value = (read s :: Integer) in value > 255 literal token = fromJust $ getLiteralStringExt lit token lit (T_DollarBraced {}) = return "0" lit (T_DollarArithmetic {}) = return "0" lit (T_DollarExpansion {}) = return "0" lit (T_Backticked {}) = return "0" lit _ = return "WTF" prop_checkFindExecWithSingleArgument1 = verify checkFindExecWithSingleArgument "find . -exec 'cat {} | wc -l' \\;" prop_checkFindExecWithSingleArgument2 = verify checkFindExecWithSingleArgument "find . -execdir 'cat {} | wc -l' +" prop_checkFindExecWithSingleArgument3 = verifyNot checkFindExecWithSingleArgument "find . -exec wc -l {} \\;" checkFindExecWithSingleArgument = CommandCheck (Basename "find") (f . arguments) where f = void . sequence . mapMaybe check . tails check (exec:arg:term:_) = do execS <- getLiteralString exec termS <- getLiteralString term cmdS <- getLiteralStringExt (const $ return " ") arg guard $ execS `elem` ["-exec", "-execdir"] && termS `elem` [";", "+"] guard $ cmdS `matches` commandRegex return $ warn (getId exec) 2150 "-exec does not invoke a shell. Rewrite or use -exec sh -c .. ." check _ = Nothing commandRegex = mkRegex "[ |;]" prop_checkUnusedEchoEscapes1 = verify checkUnusedEchoEscapes "echo 'foo\\nbar\\n'" prop_checkUnusedEchoEscapes2 = verifyNot checkUnusedEchoEscapes "echo -e 'foi\\nbar'" prop_checkUnusedEchoEscapes3 = verify checkUnusedEchoEscapes "echo \"n:\\t42\"" prop_checkUnusedEchoEscapes4 = verifyNot checkUnusedEchoEscapes "echo lol" prop_checkUnusedEchoEscapes5 = verifyNot checkUnusedEchoEscapes "echo -n -e '\n'" checkUnusedEchoEscapes = CommandCheck (Basename "echo") f where hasEscapes = mkRegex "\\\\[rnt]" f cmd = whenShell [Sh, Bash, Ksh] $ unless (cmd `hasFlag` "e") $ mapM_ examine $ arguments cmd examine token = do let str = onlyLiteralString token when (str `matches` hasEscapes) $ info (getId token) 2028 "echo may not expand escape sequences. Use printf." prop_checkInjectableFindSh1 = verify checkInjectableFindSh "find . -exec sh -c 'echo {}' \\;" prop_checkInjectableFindSh2 = verify checkInjectableFindSh "find . -execdir bash -c 'rm \"{}\"' ';'" prop_checkInjectableFindSh3 = verifyNot checkInjectableFindSh "find . -exec sh -c 'rm \"$@\"' _ {} \\;" checkInjectableFindSh = CommandCheck (Basename "find") (check . arguments) where check args = do let idStrings = map (\x -> (getId x, onlyLiteralString x)) args match pattern idStrings match _ [] = return () match [] (next:_) = action next match (p:tests) ((id, arg):args) = do when (p arg) $ match tests args match (p:tests) args pattern = [ (`elem` ["-exec", "-execdir"]), (`elem` ["sh", "bash", "dash", "ksh"]), (== "-c") ] action (id, arg) = when ("{}" `isInfixOf` arg) $ warn id 2156 "Injecting filenames is fragile and insecure. Use parameters." prop_checkFindActionPrecedence1 = verify checkFindActionPrecedence "find . -name '*.wav' -o -name '*.au' -exec rm {} +" prop_checkFindActionPrecedence2 = verifyNot checkFindActionPrecedence "find . -name '*.wav' -o \\( -name '*.au' -exec rm {} + \\)" prop_checkFindActionPrecedence3 = verifyNot checkFindActionPrecedence "find . -name '*.wav' -o -name '*.au'" checkFindActionPrecedence = CommandCheck (Basename "find") (f . arguments) where pattern = [isMatch, const True, isParam ["-o", "-or"], isMatch, const True, isAction] f list | length list < length pattern = return () f list@(_:rest) = if and (zipWith ($) pattern list) then warnFor (list !! (length pattern - 1)) else f rest isMatch = isParam [ "-name", "-regex", "-iname", "-iregex", "-wholename", "-iwholename" ] isAction = isParam [ "-exec", "-execdir", "-delete", "-print", "-print0", "-fls", "-fprint", "-fprint0", "-fprintf", "-ls", "-ok", "-okdir", "-printf" ] isParam strs t = fromMaybe False $ do param <- getLiteralString t return $ param `elem` strs warnFor t = warn (getId t) 2146 "This action ignores everything before the -o. Use \\( \\) to group." prop_checkMkdirDashPM0 = verify checkMkdirDashPM "mkdir -p -m 0755 a/b" prop_checkMkdirDashPM1 = verify checkMkdirDashPM "mkdir -pm 0755 $dir" prop_checkMkdirDashPM2 = verify checkMkdirDashPM "mkdir -vpm 0755 a/b" prop_checkMkdirDashPM3 = verify checkMkdirDashPM "mkdir -pm 0755 -v a/b" prop_checkMkdirDashPM4 = verify checkMkdirDashPM "mkdir --parents --mode=0755 a/b" prop_checkMkdirDashPM5 = verify checkMkdirDashPM "mkdir --parents --mode 0755 a/b" prop_checkMkdirDashPM6 = verify checkMkdirDashPM "mkdir -p --mode=0755 a/b" prop_checkMkdirDashPM7 = verify checkMkdirDashPM "mkdir --parents -m 0755 a/b" prop_checkMkdirDashPM8 = verifyNot checkMkdirDashPM "mkdir -p a/b" prop_checkMkdirDashPM9 = verifyNot checkMkdirDashPM "mkdir -m 0755 a/b" prop_checkMkdirDashPM10 = verifyNot checkMkdirDashPM "mkdir a/b" prop_checkMkdirDashPM11 = verifyNot checkMkdirDashPM "mkdir --parents a/b" prop_checkMkdirDashPM12 = verifyNot checkMkdirDashPM "mkdir --mode=0755 a/b" prop_checkMkdirDashPM13 = verifyNot checkMkdirDashPM "mkdir_func -pm 0755 a/b" prop_checkMkdirDashPM14 = verifyNot checkMkdirDashPM "mkdir -p -m 0755 singlelevel" prop_checkMkdirDashPM15 = verifyNot checkMkdirDashPM "mkdir -p -m 0755 ../bin" prop_checkMkdirDashPM16 = verify checkMkdirDashPM "mkdir -p -m 0755 ../bin/laden" prop_checkMkdirDashPM17 = verifyNot checkMkdirDashPM "mkdir -p -m 0755 ./bin" prop_checkMkdirDashPM18 = verify checkMkdirDashPM "mkdir -p -m 0755 ./bin/laden" prop_checkMkdirDashPM19 = verifyNot checkMkdirDashPM "mkdir -p -m 0755 ./../bin" prop_checkMkdirDashPM20 = verifyNot checkMkdirDashPM "mkdir -p -m 0755 .././bin" prop_checkMkdirDashPM21 = verifyNot checkMkdirDashPM "mkdir -p -m 0755 ../../bin" checkMkdirDashPM = CommandCheck (Basename "mkdir") check where check t = potentially $ do let flags = getAllFlags t dashP <- find ((\f -> f == "p" || f == "parents") . snd) flags dashM <- find ((\f -> f == "m" || f == "mode") . snd) flags -- mkdir -pm 0700 dir is fine, so is ../dir, but dir/subdir is not. guard $ any couldHaveSubdirs (drop 1 $ arguments t) return $ warn (getId $ fst dashM) 2174 "When used with -p, -m only applies to the deepest directory." couldHaveSubdirs t = fromMaybe True $ do name <- getLiteralString t return $ '/' `elem` name && not (name `matches` re) re = mkRegex "^(\\.\\.?\\/)+[^/]+$" prop_checkNonportableSignals1 = verify checkNonportableSignals "trap f 8" prop_checkNonportableSignals2 = verifyNot checkNonportableSignals "trap f 0" prop_checkNonportableSignals3 = verifyNot checkNonportableSignals "trap f 14" prop_checkNonportableSignals4 = verify checkNonportableSignals "trap f SIGKILL" prop_checkNonportableSignals5 = verify checkNonportableSignals "trap f 9" prop_checkNonportableSignals6 = verify checkNonportableSignals "trap f stop" prop_checkNonportableSignals7 = verifyNot checkNonportableSignals "trap 'stop' int" checkNonportableSignals = CommandCheck (Exactly "trap") (f . arguments) where f args = case args of first:rest -> unless (isFlag first) $ mapM_ check rest _ -> return () check param = potentially $ do str <- getLiteralString param let id = getId param return $ sequence_ $ mapMaybe (\f -> f id str) [ checkNumeric, checkUntrappable ] checkNumeric id str = do guard $ not (null str) guard $ all isDigit str guard $ str /= "0" -- POSIX exit trap guard $ str `notElem` ["1", "2", "3", "6", "9", "14", "15" ] -- XSI return $ warn id 2172 "Trapping signals by number is not well defined. Prefer signal names." checkUntrappable id str = do guard $ map toLower str `elem` ["kill", "9", "sigkill", "stop", "sigstop"] return $ err id 2173 "SIGKILL/SIGSTOP can not be trapped." prop_checkInteractiveSu1 = verify checkInteractiveSu "su; rm file; su $USER" prop_checkInteractiveSu2 = verify checkInteractiveSu "su foo; something; exit" prop_checkInteractiveSu3 = verifyNot checkInteractiveSu "echo rm | su foo" prop_checkInteractiveSu4 = verifyNot checkInteractiveSu "su root < script" checkInteractiveSu = CommandCheck (Basename "su") f where f cmd = when (length (arguments cmd) <= 1) $ do path <- getPathM cmd when (all undirected path) $ info (getId cmd) 2117 "To run commands as another user, use su -c or sudo." undirected (T_Pipeline _ _ l) = length l <= 1 -- This should really just be modifications to stdin, but meh undirected (T_Redirecting _ list _) = null list undirected _ = True -- This is hard to get right without properly parsing ssh args prop_checkSshCmdStr1 = verify checkSshCommandString "ssh host \"echo $PS1\"" prop_checkSshCmdStr2 = verifyNot checkSshCommandString "ssh host \"ls foo\"" prop_checkSshCmdStr3 = verifyNot checkSshCommandString "ssh \"$host\"" prop_checkSshCmdStr4 = verifyNot checkSshCommandString "ssh -i key \"$host\"" checkSshCommandString = CommandCheck (Basename "ssh") (f . arguments) where isOption x = "-" `isPrefixOf` (concat $ oversimplify x) f args = case partition isOption args of ([], hostport:r@(_:_)) -> checkArg $ last r _ -> return () checkArg (T_NormalWord _ [T_DoubleQuoted id parts]) = case filter (not . isConstant) parts of [] -> return () (x:_) -> info (getId x) 2029 "Note that, unescaped, this expands on the client side." checkArg _ = return () prop_checkPrintfVar1 = verify checkPrintfVar "printf \"Lol: $s\"" prop_checkPrintfVar2 = verifyNot checkPrintfVar "printf 'Lol: $s'" prop_checkPrintfVar3 = verify checkPrintfVar "printf -v cow $(cmd)" prop_checkPrintfVar4 = verifyNot checkPrintfVar "printf \"%${count}s\" var" prop_checkPrintfVar5 = verify checkPrintfVar "printf '%s %s %s' foo bar" prop_checkPrintfVar6 = verify checkPrintfVar "printf foo bar baz" prop_checkPrintfVar7 = verify checkPrintfVar "printf -- foo bar baz" prop_checkPrintfVar8 = verifyNot checkPrintfVar "printf '%s %s %s' \"${var[@]}\"" prop_checkPrintfVar9 = verifyNot checkPrintfVar "printf '%s %s %s\\n' *.png" prop_checkPrintfVar10= verifyNot checkPrintfVar "printf '%s %s %s' foo bar baz" prop_checkPrintfVar11= verifyNot checkPrintfVar "printf '%(%s%s)T' -1" prop_checkPrintfVar12= verify checkPrintfVar "printf '%s %s\\n' 1 2 3" prop_checkPrintfVar13= verifyNot checkPrintfVar "printf '%s %s\\n' 1 2 3 4" prop_checkPrintfVar14= verify checkPrintfVar "printf '%*s\\n' 1" prop_checkPrintfVar15= verifyNot checkPrintfVar "printf '%*s\\n' 1 2" prop_checkPrintfVar16= verifyNot checkPrintfVar "printf $'string'" prop_checkPrintfVar17= verify checkPrintfVar "printf '%-*s\\n' 1" prop_checkPrintfVar18= verifyNot checkPrintfVar "printf '%-*s\\n' 1 2" prop_checkPrintfVar19= verifyNot checkPrintfVar "printf '%(%s)T'" prop_checkPrintfVar20= verifyNot checkPrintfVar "printf '%d %(%s)T' 42" prop_checkPrintfVar21= verify checkPrintfVar "printf '%d %(%s)T'" checkPrintfVar = CommandCheck (Exactly "printf") (f . arguments) where f (doubledash:rest) | getLiteralString doubledash == Just "--" = f rest f (dashv:var:rest) | getLiteralString dashv == Just "-v" = f rest f (format:params) = check format params f _ = return () check format more = do fromMaybe (return ()) $ do string <- getLiteralString format let formats = getPrintfFormats string let formatCount = length formats let argCount = length more return $ case () of () | argCount == 0 && formatCount == 0 -> return () -- This is fine () | formatCount == 0 && argCount > 0 -> err (getId format) 2182 "This printf format string has no variables. Other arguments are ignored." () | any mayBecomeMultipleArgs more -> return () -- We don't know so trust the user () | argCount < formatCount && onlyTrailingTs formats argCount -> return () -- Allow trailing %()Ts since they use the current time () | argCount > 0 && argCount `mod` formatCount == 0 -> return () -- Great: a suitable number of arguments () -> warn (getId format) 2183 $ "This format string has " ++ show formatCount ++ " variables, but is passed " ++ show argCount ++ " arguments." unless ('%' `elem` concat (oversimplify format) || isLiteral format) $ info (getId format) 2059 "Don't use variables in the printf format string. Use printf \"..%s..\" \"$foo\"." where onlyTrailingTs format argCount = all (== 'T') $ drop argCount format prop_checkGetPrintfFormats1 = getPrintfFormats "%s" == "s" prop_checkGetPrintfFormats2 = getPrintfFormats "%0*s" == "*s" prop_checkGetPrintfFormats3 = getPrintfFormats "%(%s)T" == "T" prop_checkGetPrintfFormats4 = getPrintfFormats "%d%%%(%s)T" == "dT" prop_checkGetPrintfFormats5 = getPrintfFormats "%bPassed: %d, %bFailed: %d%b, Skipped: %d, %bErrored: %d%b\\n" == "bdbdbdbdb" getPrintfFormats = getFormats where -- Get the arguments in the string as a string of type characters, -- e.g. "Hello %s" -> "s" and "%(%s)T %0*d\n" -> "T*d" getFormats :: String -> String getFormats string = case string of '%':'%':rest -> getFormats rest '%':'(':rest -> case dropWhile (/= ')') rest of ')':c:trailing -> c : getFormats trailing _ -> "" '%':rest -> regexBasedGetFormats rest _:rest -> getFormats rest [] -> "" regexBasedGetFormats rest = case matchRegex re rest of Just [width, precision, typ, rest] -> (if width == "*" then "*" else "") ++ (if precision == "*" then "*" else "") ++ typ ++ getFormats rest Nothing -> take 1 rest ++ getFormats rest where -- constructed based on specifications in "man printf" re = mkRegex "#?-?\\+? ?0?(\\*|\\d*)\\.?(\\d*|\\*)([diouxXfFeEgGaAcsbq])(.*)" -- \____ _____/\___ ____/ \____ ____/\_________ _________/ \ / -- V V V V V -- flags field width precision format character rest -- field width and precision can be specified with a '*' instead of a digit, -- in which case printf will accept one more argument for each '*' used prop_checkUuoeCmd1 = verify checkUuoeCmd "echo $(date)" prop_checkUuoeCmd2 = verify checkUuoeCmd "echo `date`" prop_checkUuoeCmd3 = verify checkUuoeCmd "echo \"$(date)\"" prop_checkUuoeCmd4 = verify checkUuoeCmd "echo \"`date`\"" prop_checkUuoeCmd5 = verifyNot checkUuoeCmd "echo \"The time is $(date)\"" prop_checkUuoeCmd6 = verifyNot checkUuoeCmd "echo \"$( x == "" || x == "a") opts check cmd = mapM_ warning $ getVars cmd warning t = potentially $ do var <- getSingleUnmodifiedVariable t let name = bracedString var guard $ isVariableName name -- e.g. not $1 return . warn (getId t) 2229 $ "This does not read '" ++ name ++ "'. Remove $/${} for that, or use ${var?} to quiet." -- Return the single variable expansion that makes up this word, if any. -- e.g. $foo -> $foo, "$foo"'' -> $foo , "hello $name" -> Nothing getSingleUnmodifiedVariable :: Token -> Maybe Token getSingleUnmodifiedVariable word = case getWordParts word of [t@(T_DollarBraced {})] -> let contents = bracedString t name = getBracedReference contents in guard (contents == name) >> return t _ -> Nothing prop_checkAliasesUsesArgs1 = verify checkAliasesUsesArgs "alias a='cp $1 /a'" prop_checkAliasesUsesArgs2 = verifyNot checkAliasesUsesArgs "alias $1='foo'" prop_checkAliasesUsesArgs3 = verify checkAliasesUsesArgs "alias a=\"echo \\${@}\"" checkAliasesUsesArgs = CommandCheck (Exactly "alias") (f . arguments) where re = mkRegex "\\$\\{?[0-9*@]" f = mapM_ checkArg checkArg arg = let string = fromJust $ getLiteralStringExt (const $ return "_") arg in when ('=' `elem` string && string `matches` re) $ err (getId arg) 2142 "Aliases can't use positional parameters. Use a function." prop_checkAliasesExpandEarly1 = verify checkAliasesExpandEarly "alias foo=\"echo $PWD\"" prop_checkAliasesExpandEarly2 = verifyNot checkAliasesExpandEarly "alias -p" prop_checkAliasesExpandEarly3 = verifyNot checkAliasesExpandEarly "alias foo='echo {1..10}'" checkAliasesExpandEarly = CommandCheck (Exactly "alias") (f . arguments) where f = mapM_ checkArg checkArg arg | '=' `elem` concat (oversimplify arg) = forM_ (take 1 $ filter (not . isLiteral) $ getWordParts arg) $ \x -> warn (getId x) 2139 "This expands when defined, not when used. Consider escaping." checkArg _ = return () prop_checkUnsetGlobs1 = verify checkUnsetGlobs "unset foo[1]" prop_checkUnsetGlobs2 = verifyNot checkUnsetGlobs "unset foo" checkUnsetGlobs = CommandCheck (Exactly "unset") (mapM_ check . arguments) where check arg = when (isGlob arg) $ warn (getId arg) 2184 "Quote arguments to unset so they're not glob expanded." prop_checkFindWithoutPath1 = verify checkFindWithoutPath "find -type f" prop_checkFindWithoutPath2 = verify checkFindWithoutPath "find" prop_checkFindWithoutPath3 = verifyNot checkFindWithoutPath "find . -type f" prop_checkFindWithoutPath4 = verifyNot checkFindWithoutPath "find -H -L \"$path\" -print" prop_checkFindWithoutPath5 = verifyNot checkFindWithoutPath "find -O3 ." prop_checkFindWithoutPath6 = verifyNot checkFindWithoutPath "find -D exec ." prop_checkFindWithoutPath7 = verifyNot checkFindWithoutPath "find --help" prop_checkFindWithoutPath8 = verifyNot checkFindWithoutPath "find -Hx . -print" checkFindWithoutPath = CommandCheck (Basename "find") f where f t@(T_SimpleCommand _ _ (cmd:args)) = unless (t `hasFlag` "help" || hasPath args) $ info (getId cmd) 2185 "Some finds don't have a default path. Specify '.' explicitly." -- This is a bit of a kludge. find supports flag arguments both before and -- after the path, as well as multiple non-flag arguments that are not the -- path. We assume that all the pre-path flags are single characters from a -- list of GNU and macOS flags. hasPath (first:rest) = let flag = fromJust $ getLiteralStringExt (const $ return "___") first in not ("-" `isPrefixOf` flag) || isLeadingFlag flag && hasPath rest hasPath [] = False isLeadingFlag flag = length flag <= 2 || all (`elem` leadingFlagChars) flag leadingFlagChars="-EHLPXdfsxO0123456789" prop_checkTimeParameters1 = verify checkTimeParameters "time -f lol sleep 10" prop_checkTimeParameters2 = verifyNot checkTimeParameters "time sleep 10" prop_checkTimeParameters3 = verifyNot checkTimeParameters "time -p foo" prop_checkTimeParameters4 = verifyNot checkTimeParameters "command time -f lol sleep 10" checkTimeParameters = CommandCheck (Exactly "time") f where f (T_SimpleCommand _ _ (cmd:args:_)) = whenShell [Bash, Sh] $ let s = concat $ oversimplify args in when ("-" `isPrefixOf` s && s /= "-p") $ info (getId cmd) 2023 "The shell may override 'time' as seen in man time(1). Use 'command time ..' for that one." f _ = return () prop_checkTimedCommand1 = verify checkTimedCommand "#!/bin/sh\ntime -p foo | bar" prop_checkTimedCommand2 = verify checkTimedCommand "#!/bin/dash\ntime ( foo; bar; )" prop_checkTimedCommand3 = verifyNot checkTimedCommand "#!/bin/sh\ntime sleep 1" checkTimedCommand = CommandCheck (Exactly "time") f where f (T_SimpleCommand _ _ (c:args@(_:_))) = whenShell [Sh, Dash] $ do let cmd = last args -- "time" is parsed with a command as argument when (isPiped cmd) $ warn (getId c) 2176 "'time' is undefined for pipelines. time single stage or bash -c instead." when (isSimple cmd == Just False) $ warn (getId cmd) 2177 "'time' is undefined for compound commands, time sh -c instead." f _ = return () isPiped cmd = case cmd of T_Pipeline _ _ (_:_:_) -> True _ -> False getCommand cmd = case cmd of T_Pipeline _ _ (T_Redirecting _ _ a : _) -> return a _ -> fail "" isSimple cmd = do innerCommand <- getCommand cmd case innerCommand of T_SimpleCommand {} -> return True _ -> return False prop_checkLocalScope1 = verify checkLocalScope "local foo=3" prop_checkLocalScope2 = verifyNot checkLocalScope "f() { local foo=3; }" checkLocalScope = CommandCheck (Exactly "local") $ \t -> whenShell [Bash, Dash] $ do -- Ksh allows it, Sh doesn't support local path <- getPathM t unless (any isFunctionLike path) $ err (getId $ getCommandTokenOrThis t) 2168 "'local' is only valid in functions." prop_checkDeprecatedTempfile1 = verify checkDeprecatedTempfile "var=$(tempfile)" prop_checkDeprecatedTempfile2 = verifyNot checkDeprecatedTempfile "tempfile=$(mktemp)" checkDeprecatedTempfile = CommandCheck (Basename "tempfile") $ \t -> warn (getId $ getCommandTokenOrThis t) 2186 "tempfile is deprecated. Use mktemp instead." prop_checkDeprecatedEgrep = verify checkDeprecatedEgrep "egrep '.+'" checkDeprecatedEgrep = CommandCheck (Basename "egrep") $ \t -> info (getId $ getCommandTokenOrThis t) 2196 "egrep is non-standard and deprecated. Use grep -E instead." prop_checkDeprecatedFgrep = verify checkDeprecatedFgrep "fgrep '*' files" checkDeprecatedFgrep = CommandCheck (Basename "fgrep") $ \t -> info (getId $ getCommandTokenOrThis t) 2197 "fgrep is non-standard and deprecated. Use grep -F instead." prop_checkWhileGetoptsCase1 = verify checkWhileGetoptsCase "while getopts 'a:b' x; do case $x in a) foo;; esac; done" prop_checkWhileGetoptsCase2 = verify checkWhileGetoptsCase "while getopts 'a:' x; do case $x in a) foo;; b) bar;; esac; done" prop_checkWhileGetoptsCase3 = verifyNot checkWhileGetoptsCase "while getopts 'a:b' x; do case $x in a) foo;; b) bar;; *) :;esac; done" prop_checkWhileGetoptsCase4 = verifyNot checkWhileGetoptsCase "while getopts 'a:123' x; do case $x in a) foo;; [0-9]) bar;; esac; done" prop_checkWhileGetoptsCase5 = verifyNot checkWhileGetoptsCase "while getopts 'a:' x; do case $x in a) foo;; \\?) bar;; *) baz;; esac; done" checkWhileGetoptsCase = CommandCheck (Exactly "getopts") f where f :: Token -> Analysis f t@(T_SimpleCommand _ _ (cmd:arg1:_)) = do path <- getPathM t potentially $ do options <- getLiteralString arg1 (T_WhileExpression _ _ body) <- findFirst whileLoop path caseCmd <- mapMaybe findCase body !!! 0 return $ check (getId arg1) (map (:[]) $ filter (/= ':') options) caseCmd f _ = return () check :: Id -> [String] -> Token -> Analysis check optId opts (T_CaseExpression id _ list) = do unless (Nothing `Map.member` handledMap) $ do mapM_ (warnUnhandled optId id) $ catMaybes $ Map.keys notHandled unless (any (`Map.member` handledMap) [Just "*",Just "?"]) $ warn id 2220 "Invalid flags are not handled. Add a *) case." mapM_ warnRedundant $ Map.toList notRequested where handledMap = Map.fromList (concatMap getHandledStrings list) requestedMap = Map.fromList $ map (\x -> (Just x, ())) opts notHandled = Map.difference requestedMap handledMap notRequested = Map.difference handledMap requestedMap warnUnhandled optId caseId str = warn caseId 2213 $ "getopts specified -" ++ str ++ ", but it's not handled by this 'case'." warnRedundant (key, expr) = potentially $ do str <- key guard $ str `notElem` ["*", ":", "?"] return $ warn (getId expr) 2214 "This case is not specified by getopts." getHandledStrings (_, globs, _) = map (\x -> (literal x, x)) globs literal :: Token -> Maybe String literal t = do getLiteralString t <> fromGlob t fromGlob t = case t of T_Glob _ ('[':c:']':[]) -> return [c] T_Glob _ "*" -> return "*" T_Glob _ "?" -> return "?" _ -> Nothing whileLoop t = case t of T_WhileExpression {} -> return True T_Script {} -> return False _ -> Nothing findCase t = case t of T_Annotation _ _ x -> findCase x T_Pipeline _ _ [x] -> findCase x T_Redirecting _ _ x@(T_CaseExpression {}) -> return x _ -> Nothing prop_checkCatastrophicRm1 = verify checkCatastrophicRm "rm -r $1/$2" prop_checkCatastrophicRm2 = verify checkCatastrophicRm "rm -r /home/$foo" prop_checkCatastrophicRm3 = verifyNot checkCatastrophicRm "rm -r /home/${USER:?}/*" prop_checkCatastrophicRm4 = verify checkCatastrophicRm "rm -fr /home/$(whoami)/*" prop_checkCatastrophicRm5 = verifyNot checkCatastrophicRm "rm -r /home/${USER:-thing}/*" prop_checkCatastrophicRm6 = verify checkCatastrophicRm "rm --recursive /etc/*$config*" prop_checkCatastrophicRm8 = verify checkCatastrophicRm "rm -rf /home" prop_checkCatastrophicRm10= verifyNot checkCatastrophicRm "rm -r \"${DIR}\"/{.gitignore,.gitattributes,ci}" prop_checkCatastrophicRm11= verify checkCatastrophicRm "rm -r /{bin,sbin}/$exec" prop_checkCatastrophicRm12= verify checkCatastrophicRm "rm -r /{{usr,},{bin,sbin}}/$exec" prop_checkCatastrophicRm13= verifyNot checkCatastrophicRm "rm -r /{{a,b},{c,d}}/$exec" prop_checkCatastrophicRmA = verify checkCatastrophicRm "rm -rf /usr /lib/nvidia-current/xorg/xorg" prop_checkCatastrophicRmB = verify checkCatastrophicRm "rm -rf \"$STEAMROOT/\"*" checkCatastrophicRm = CommandCheck (Basename "rm") $ \t -> when (isRecursive t) $ mapM_ (mapM_ checkWord . braceExpand) $ arguments t where isRecursive = any (`elem` ["r", "R", "recursive"]) . map snd . getAllFlags checkWord token = case getLiteralString token of Just str -> when (fixPath str `elem` importantPaths) $ warn (getId token) 2114 "Warning: deletes a system directory." Nothing -> checkWord' token checkWord' token = fromMaybe (return ()) $ do filename <- getPotentialPath token let path = fixPath filename return . when (path `elem` importantPaths) $ warn (getId token) 2115 $ "Use \"${var:?}\" to ensure this never expands to " ++ path ++ " ." fixPath filename = let normalized = skipRepeating '/' . skipRepeating '*' $ filename in if normalized == "/" then normalized else stripTrailing '/' normalized getPotentialPath = getLiteralStringExt f where f (T_Glob _ str) = return str f (T_DollarBraced _ _ word) = let var = onlyLiteralString word in -- This shouldn't handle non-colon cases. if any (`isInfixOf` var) [":?", ":-", ":="] then Nothing else return "" f _ = return "" stripTrailing c = reverse . dropWhile (== c) . reverse skipRepeating c (a:b:rest) | a == b && b == c = skipRepeating c (b:rest) skipRepeating c (a:r) = a:skipRepeating c r skipRepeating _ [] = [] paths = [ "", "/bin", "/etc", "/home", "/mnt", "/usr", "/usr/share", "/usr/local", "/var", "/lib", "/dev", "/media", "/boot", "/lib64", "/usr/bin" ] importantPaths = filter (not . null) $ ["", "/", "/*", "/*/*"] >>= (\x -> map (++x) paths) prop_checkLetUsage1 = verify checkLetUsage "let a=1" prop_checkLetUsage2 = verifyNot checkLetUsage "(( a=1 ))" checkLetUsage = CommandCheck (Exactly "let") f where f t = whenShell [Bash,Ksh] $ do style (getId t) 2219 $ "Instead of 'let expr', prefer (( expr )) ." missingDestination handler token = do case params of [single] -> do unless (hasTarget || mayBecomeMultipleArgs single) $ handler token _ -> return () where args = getAllFlags token params = map fst $ filter (\(_,x) -> x == "") args hasTarget = any (\x -> x /= "" && x `isPrefixOf` "target-directory") $ map snd args prop_checkMvArguments1 = verify checkMvArguments "mv 'foo bar'" prop_checkMvArguments2 = verifyNot checkMvArguments "mv foo bar" prop_checkMvArguments3 = verifyNot checkMvArguments "mv 'foo bar'{,bak}" prop_checkMvArguments4 = verifyNot checkMvArguments "mv \"$@\"" prop_checkMvArguments5 = verifyNot checkMvArguments "mv -t foo bar" prop_checkMvArguments6 = verifyNot checkMvArguments "mv --target-directory=foo bar" prop_checkMvArguments7 = verifyNot checkMvArguments "mv --target-direc=foo bar" prop_checkMvArguments8 = verifyNot checkMvArguments "mv --version" prop_checkMvArguments9 = verifyNot checkMvArguments "mv \"${!var}\"" checkMvArguments = CommandCheck (Basename "mv") $ missingDestination f where f t = err (getId t) 2224 "This mv has no destination. Check the arguments." checkCpArguments = CommandCheck (Basename "cp") $ missingDestination f where f t = err (getId t) 2225 "This cp has no destination. Check the arguments." checkLnArguments = CommandCheck (Basename "ln") $ missingDestination f where f t = warn (getId t) 2226 "This ln has no destination. Check the arguments, or specify '.' explicitly." prop_checkFindRedirections1 = verify checkFindRedirections "find . -exec echo {} > file \\;" prop_checkFindRedirections2 = verifyNot checkFindRedirections "find . -exec echo {} \\; > file" prop_checkFindRedirections3 = verifyNot checkFindRedirections "find . -execdir sh -c 'foo > file' \\;" checkFindRedirections = CommandCheck (Basename "find") f where f t = do redirecting <- getClosestCommandM t case redirecting of Just (T_Redirecting _ redirs@(_:_) (T_SimpleCommand _ _ args@(_:_:_))) -> do -- This assumes IDs are sequential, which is mostly but not always true. let minRedir = minimum $ map getId redirs let maxArg = maximum $ map getId args when (minRedir < maxArg) $ warn minRedir 2227 "Redirection applies to the find command itself. Rewrite to work per action (or move to end)." _ -> return () prop_checkWhich = verify checkWhich "which '.+'" checkWhich = CommandCheck (Basename "which") $ \t -> info (getId $ getCommandTokenOrThis t) 2230 "which is non-standard. Use builtin 'command -v' instead." prop_checkSudoRedirect1 = verify checkSudoRedirect "sudo echo 3 > /proc/file" prop_checkSudoRedirect2 = verify checkSudoRedirect "sudo cmd < input" prop_checkSudoRedirect3 = verify checkSudoRedirect "sudo cmd >> file" prop_checkSudoRedirect4 = verify checkSudoRedirect "sudo cmd &> file" prop_checkSudoRedirect5 = verifyNot checkSudoRedirect "sudo cmd 2>&1" prop_checkSudoRedirect6 = verifyNot checkSudoRedirect "sudo cmd 2> log" prop_checkSudoRedirect7 = verifyNot checkSudoRedirect "sudo cmd > /dev/null 2>&1" checkSudoRedirect = CommandCheck (Basename "sudo") f where f t = do t_redir <- getClosestCommandM t case t_redir of Just (T_Redirecting _ redirs _) -> mapM_ warnAbout redirs warnAbout (T_FdRedirect _ s (T_IoFile id op file)) | (s == "" || s == "&") && not (special file) = case op of T_Less _ -> info (getId op) 2024 "sudo doesn't affect redirects. Use sudo cat file | .." T_Greater _ -> warn (getId op) 2024 "sudo doesn't affect redirects. Use ..| sudo tee file" T_DGREAT _ -> warn (getId op) 2024 "sudo doesn't affect redirects. Use .. | sudo tee -a file" _ -> return () warnAbout _ = return () special file = concat (oversimplify file) == "/dev/null" prop_checkSudoArgs1 = verify checkSudoArgs "sudo cd /root" prop_checkSudoArgs2 = verify checkSudoArgs "sudo export x=3" prop_checkSudoArgs3 = verifyNot checkSudoArgs "sudo ls /usr/local/protected" prop_checkSudoArgs4 = verifyNot checkSudoArgs "sudo ls && export x=3" prop_checkSudoArgs5 = verifyNot checkSudoArgs "sudo echo ls" prop_checkSudoArgs6 = verifyNot checkSudoArgs "sudo -n -u export ls" prop_checkSudoArgs7 = verifyNot checkSudoArgs "sudo docker export foo" checkSudoArgs = CommandCheck (Basename "sudo") f where f t = potentially $ do opts <- parseOpts t let nonFlags = map snd $ filter (\(flag, _) -> flag == "") opts commandArg <- nonFlags !!! 0 command <- getLiteralString commandArg guard $ command `elem` builtins return $ warn (getId t) 2232 $ "Can't use sudo with builtins like " ++ command ++ ". Did you want sudo sh -c .. instead?" builtins = [ "cd", "eval", "export", "history", "read", "source", "wait" ] -- This mess is why ShellCheck prefers not to know. parseOpts = getBsdOpts "vAknSbEHPa:g:h:p:u:c:T:r:" prop_checkSourceArgs1 = verify checkSourceArgs "#!/bin/sh\n. script arg" prop_checkSourceArgs2 = verifyNot checkSourceArgs "#!/bin/sh\n. script" prop_checkSourceArgs3 = verifyNot checkSourceArgs "#!/bin/bash\n. script arg" checkSourceArgs = CommandCheck (Exactly ".") f where f t = whenShell [Sh, Dash] $ case arguments t of (file:arg1:_) -> warn (getId arg1) 2240 $ "The dot command does not support arguments in sh/dash. Set them as variables." _ -> return () prop_checkChmodDashr1 = verify checkChmodDashr "chmod -r 0755 dir" prop_checkChmodDashr2 = verifyNot checkChmodDashr "chmod -R 0755 dir" prop_checkChmodDashr3 = verifyNot checkChmodDashr "chmod a-r dir" checkChmodDashr = CommandCheck (Basename "chmod") f where f t = mapM_ check $ arguments t check t = potentially $ do flag <- getLiteralString t guard $ flag == "-r" return $ warn (getId t) 2253 "Use -R to recurse, or explicitly a-r to remove read permissions." return [] runTests = $( [| $(forAllProperties) (quickCheckWithResult (stdArgs { maxSuccess = 1 }) ) |]) ShellCheck-0.7.0/src/ShellCheck/Checks/Custom.hs0000644000000000000000000000102613517444075017524 0ustar0000000000000000{- This empty file is provided for ease of patching in site specific checks. However, there are no guarantees regarding compatibility between versions. -} {-# LANGUAGE TemplateHaskell #-} module ShellCheck.Checks.Custom (checker, ShellCheck.Checks.Custom.runTests) where import ShellCheck.AnalyzerLib import Test.QuickCheck checker :: Parameters -> Checker checker params = Checker { perScript = const $ return (), perToken = const $ return () } prop_CustomTestsWork = True return [] runTests = $quickCheckAll ShellCheck-0.7.0/src/ShellCheck/Checks/ShellSupport.hs0000644000000000000000000006244413517444075020731 0ustar0000000000000000{- Copyright 2012-2016 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} {-# LANGUAGE FlexibleContexts #-} module ShellCheck.Checks.ShellSupport (checker , ShellCheck.Checks.ShellSupport.runTests) where import ShellCheck.AST import ShellCheck.ASTLib import ShellCheck.AnalyzerLib import ShellCheck.Interface import ShellCheck.Regex import Control.Monad import Control.Monad.RWS import Data.Char import Data.List import Data.Maybe import qualified Data.Map as Map import qualified Data.Set as Set import Test.QuickCheck.All (forAllProperties) import Test.QuickCheck.Test (quickCheckWithResult, stdArgs, maxSuccess) data ForShell = ForShell [Shell] (Token -> Analysis) getChecker params list = Checker { perScript = nullCheck, perToken = foldl composeAnalyzers nullCheck $ mapMaybe include list } where shell = shellType params include (ForShell list a) = do guard $ shell `elem` list return a checker params = getChecker params checks checks = [ checkForDecimals ,checkBashisms ,checkEchoSed ,checkBraceExpansionVars ,checkMultiDimensionalArrays ,checkPS1Assignments ] testChecker (ForShell _ t) = Checker { perScript = nullCheck, perToken = t } verify c s = producesComments (testChecker c) s == Just True verifyNot c s = producesComments (testChecker c) s == Just False prop_checkForDecimals1 = verify checkForDecimals "((3.14*c))" prop_checkForDecimals2 = verify checkForDecimals "foo[1.2]=bar" prop_checkForDecimals3 = verifyNot checkForDecimals "declare -A foo; foo[1.2]=bar" checkForDecimals = ForShell [Sh, Dash, Bash] f where f t@(TA_Expansion id _) = potentially $ do str <- getLiteralString t first <- str !!! 0 guard $ isDigit first && '.' `elem` str return $ err id 2079 "(( )) doesn't support decimals. Use bc or awk." f _ = return () prop_checkBashisms = verify checkBashisms "while read a; do :; done < <(a)" prop_checkBashisms2 = verify checkBashisms "[ foo -nt bar ]" prop_checkBashisms3 = verify checkBashisms "echo $((i++))" prop_checkBashisms4 = verify checkBashisms "rm !(*.hs)" prop_checkBashisms5 = verify checkBashisms "source file" prop_checkBashisms6 = verify checkBashisms "[ \"$a\" == 42 ]" prop_checkBashisms7 = verify checkBashisms "echo ${var[1]}" prop_checkBashisms8 = verify checkBashisms "echo ${!var[@]}" prop_checkBashisms9 = verify checkBashisms "echo ${!var*}" prop_checkBashisms10= verify checkBashisms "echo ${var:4:12}" prop_checkBashisms11= verifyNot checkBashisms "echo ${var:-4}" prop_checkBashisms12= verify checkBashisms "echo ${var//foo/bar}" prop_checkBashisms13= verify checkBashisms "exec -c env" prop_checkBashisms14= verify checkBashisms "echo -n \"Foo: \"" prop_checkBashisms15= verify checkBashisms "let n++" prop_checkBashisms16= verify checkBashisms "echo $RANDOM" prop_checkBashisms17= verify checkBashisms "echo $((RANDOM%6+1))" prop_checkBashisms18= verify checkBashisms "foo &> /dev/null" prop_checkBashisms19= verify checkBashisms "foo > file*.txt" prop_checkBashisms20= verify checkBashisms "read -ra foo" prop_checkBashisms21= verify checkBashisms "[ -a foo ]" prop_checkBashisms22= verifyNot checkBashisms "[ foo -a bar ]" prop_checkBashisms23= verify checkBashisms "trap mything ERR INT" prop_checkBashisms24= verifyNot checkBashisms "trap mything INT TERM" prop_checkBashisms25= verify checkBashisms "cat < /dev/tcp/host/123" prop_checkBashisms26= verify checkBashisms "trap mything ERR SIGTERM" prop_checkBashisms27= verify checkBashisms "echo *[^0-9]*" prop_checkBashisms28= verify checkBashisms "exec {n}>&2" prop_checkBashisms29= verify checkBashisms "echo ${!var}" prop_checkBashisms30= verify checkBashisms "printf -v '%s' \"$1\"" prop_checkBashisms31= verify checkBashisms "printf '%q' \"$1\"" prop_checkBashisms32= verifyNot checkBashisms "#!/bin/dash\n[ foo -nt bar ]" prop_checkBashisms33= verify checkBashisms "#!/bin/sh\necho -n foo" prop_checkBashisms34= verifyNot checkBashisms "#!/bin/dash\necho -n foo" prop_checkBashisms35= verifyNot checkBashisms "#!/bin/dash\nlocal foo" prop_checkBashisms36= verifyNot checkBashisms "#!/bin/dash\nread -p foo -r bar" prop_checkBashisms37= verifyNot checkBashisms "HOSTNAME=foo; echo $HOSTNAME" prop_checkBashisms38= verify checkBashisms "RANDOM=9; echo $RANDOM" prop_checkBashisms39= verify checkBashisms "foo-bar() { true; }" prop_checkBashisms40= verify checkBashisms "echo $(/dev/null" prop_checkBashisms48= verifyNot checkBashisms "#!/bin/sh\necho $LINENO" prop_checkBashisms49= verify checkBashisms "#!/bin/dash\necho $MACHTYPE" prop_checkBashisms50= verify checkBashisms "#!/bin/sh\ncmd >& file" prop_checkBashisms51= verifyNot checkBashisms "#!/bin/sh\ncmd 2>&1" prop_checkBashisms52= verifyNot checkBashisms "#!/bin/sh\ncmd >&2" prop_checkBashisms53= verifyNot checkBashisms "#!/bin/sh\nprintf -- -f\n" prop_checkBashisms54= verify checkBashisms "#!/bin/sh\nfoo+=bar" prop_checkBashisms55= verify checkBashisms "#!/bin/sh\necho ${@%foo}" prop_checkBashisms56= verifyNot checkBashisms "#!/bin/sh\necho ${##}" prop_checkBashisms57= verifyNot checkBashisms "#!/bin/dash\nulimit -c 0" prop_checkBashisms58= verify checkBashisms "#!/bin/sh\nulimit -c 0" prop_checkBashisms59 = verify checkBashisms "#!/bin/sh\njobs -s" prop_checkBashisms60 = verifyNot checkBashisms "#!/bin/sh\njobs -p" prop_checkBashisms61 = verifyNot checkBashisms "#!/bin/sh\njobs -lp" prop_checkBashisms62 = verify checkBashisms "#!/bin/sh\nexport -f foo" prop_checkBashisms63 = verifyNot checkBashisms "#!/bin/sh\nexport -p" prop_checkBashisms64 = verify checkBashisms "#!/bin/sh\nreadonly -a" prop_checkBashisms65 = verifyNot checkBashisms "#!/bin/sh\nreadonly -p" prop_checkBashisms66 = verifyNot checkBashisms "#!/bin/sh\ncd -P ." prop_checkBashisms67 = verify checkBashisms "#!/bin/sh\ncd -P -e ." prop_checkBashisms68 = verify checkBashisms "#!/bin/sh\numask -p" prop_checkBashisms69 = verifyNot checkBashisms "#!/bin/sh\numask -S" prop_checkBashisms70 = verify checkBashisms "#!/bin/sh\ntrap -l" prop_checkBashisms71 = verify checkBashisms "#!/bin/sh\ntype -a ls" prop_checkBashisms72 = verifyNot checkBashisms "#!/bin/sh\ntype ls" prop_checkBashisms73 = verify checkBashisms "#!/bin/sh\nunset -n namevar" prop_checkBashisms74 = verifyNot checkBashisms "#!/bin/sh\nunset -f namevar" prop_checkBashisms75 = verifyNot checkBashisms "#!/bin/sh\necho \"-n foo\"" prop_checkBashisms76 = verifyNot checkBashisms "#!/bin/sh\necho \"-ne foo\"" prop_checkBashisms77 = verifyNot checkBashisms "#!/bin/sh\necho -Q foo" prop_checkBashisms78 = verify checkBashisms "#!/bin/sh\necho -ne foo" prop_checkBashisms79 = verify checkBashisms "#!/bin/sh\nhash -l" prop_checkBashisms80 = verifyNot checkBashisms "#!/bin/sh\nhash -r" prop_checkBashisms81 = verifyNot checkBashisms "#!/bin/dash\nhash -v" prop_checkBashisms82 = verifyNot checkBashisms "#!/bin/sh\nset -v +o allexport -o errexit -C" prop_checkBashisms83 = verifyNot checkBashisms "#!/bin/sh\nset --" prop_checkBashisms84 = verify checkBashisms "#!/bin/sh\nset -o pipefail" prop_checkBashisms85 = verify checkBashisms "#!/bin/sh\nset -B" prop_checkBashisms86 = verifyNot checkBashisms "#!/bin/dash\nset -o emacs" prop_checkBashisms87 = verify checkBashisms "#!/bin/sh\nset -o emacs" prop_checkBashisms88 = verifyNot checkBashisms "#!/bin/sh\nset -- wget -o foo 'https://some.url'" prop_checkBashisms89 = verifyNot checkBashisms "#!/bin/sh\nopts=$-\nset -\"$opts\"" prop_checkBashisms90 = verifyNot checkBashisms "#!/bin/sh\nset -o \"$opt\"" prop_checkBashisms91 = verify checkBashisms "#!/bin/sh\nwait -n" prop_checkBashisms92 = verify checkBashisms "#!/bin/sh\necho $((16#FF))" prop_checkBashisms93 = verify checkBashisms "#!/bin/sh\necho $(( 10#$(date +%m) ))" prop_checkBashisms94 = verify checkBashisms "#!/bin/sh\n[ -v var ]" prop_checkBashisms95 = verify checkBashisms "#!/bin/sh\necho $_" prop_checkBashisms96 = verifyNot checkBashisms "#!/bin/dash\necho $_" checkBashisms = ForShell [Sh, Dash] $ \t -> do params <- ask kludge params t where -- This code was copy-pasted from Analytics where params was a variable kludge params = bashism where isDash = shellType params == Dash warnMsg id s = if isDash then warn id 2169 $ "In dash, " ++ s ++ " not supported." else warn id 2039 $ "In POSIX sh, " ++ s ++ " undefined." bashism (T_ProcSub id _ _) = warnMsg id "process substitution is" bashism (T_Extglob id _ _) = warnMsg id "extglob is" bashism (T_DollarSingleQuoted id _) = warnMsg id "$'..' is" bashism (T_DollarDoubleQuoted id _) = warnMsg id "$\"..\" is" bashism (T_ForArithmetic id _ _ _ _) = warnMsg id "arithmetic for loops are" bashism (T_Arithmetic id _) = warnMsg id "standalone ((..)) is" bashism (T_DollarBracket id _) = warnMsg id "$[..] in place of $((..)) is" bashism (T_SelectIn id _ _ _) = warnMsg id "select loops are" bashism (T_BraceExpansion id _) = warnMsg id "brace expansion is" bashism (T_Condition id DoubleBracket _) = warnMsg id "[[ ]] is" bashism (T_HereString id _) = warnMsg id "here-strings are" bashism (TC_Binary id SingleBracket op _ _) | op `elem` [ "<", ">", "\\<", "\\>", "<=", ">=", "\\<=", "\\>="] = unless isDash $ warnMsg id $ "lexicographical " ++ op ++ " is" bashism (TC_Binary id SingleBracket op _ _) | op `elem` [ "-nt", "-ef" ] = unless isDash $ warnMsg id $ op ++ " is" bashism (TC_Binary id SingleBracket "==" _ _) = warnMsg id "== in place of = is" bashism (TC_Binary id SingleBracket "=~" _ _) = warnMsg id "=~ regex matching is" bashism (TC_Unary id SingleBracket "-v" _) = warnMsg id "unary -v (in place of [ -n \"${var+x}\" ]) is" bashism (TC_Unary id _ "-a" _) = warnMsg id "unary -a in place of -e is" bashism (TA_Unary id op _) | op `elem` [ "|++", "|--", "++|", "--|"] = warnMsg id $ filter (/= '|') op ++ " is" bashism (TA_Binary id "**" _ _) = warnMsg id "exponentials are" bashism (T_FdRedirect id "&" (T_IoFile _ (T_Greater _) _)) = warnMsg id "&> is" bashism (T_FdRedirect id "" (T_IoFile _ (T_GREATAND _) _)) = warnMsg id ">& is" bashism (T_FdRedirect id ('{':_) _) = warnMsg id "named file descriptors are" bashism (T_FdRedirect id num _) | all isDigit num && length num > 1 = warnMsg id "FDs outside 0-9 are" bashism (T_Assignment id Append _ _ _) = warnMsg id "+= is" bashism (T_IoFile id _ word) | isNetworked = warnMsg id "/dev/{tcp,udp} is" where file = onlyLiteralString word isNetworked = any (`isPrefixOf` file) ["/dev/tcp", "/dev/udp"] bashism (T_Glob id str) | "[^" `isInfixOf` str = warnMsg id "^ in place of ! in glob bracket expressions is" bashism t@(TA_Variable id str _) | isBashVariable str = warnMsg id $ str ++ " is" bashism t@(T_DollarBraced id _ token) = do mapM_ check expansion when (isBashVariable var) $ warnMsg id $ var ++ " is" where str = bracedString t var = getBracedReference str check (regex, feature) = when (isJust $ matchRegex regex str) $ warnMsg id feature bashism t@(T_Pipe id "|&") = warnMsg id "|& in place of 2>&1 | is" bashism (T_Array id _) = warnMsg id "arrays are" bashism (T_IoFile id _ t) | isGlob t = warnMsg id "redirecting to/from globs is" bashism (T_CoProc id _ _) = warnMsg id "coproc is" bashism (T_Function id _ _ str _) | not (isVariableName str) = warnMsg id "naming functions outside [a-zA-Z_][a-zA-Z0-9_]* is" bashism (T_DollarExpansion id [x]) | isOnlyRedirection x = warnMsg id "$( [(Id, String)] getLiteralArgs (first:rest) = fromMaybe [] $ do str <- getLiteralString first return $ (getId first, str) : getLiteralArgs rest getLiteralArgs [] = [] -- Check a flag-option pair (such as -o errexit) checkOptions (flag@(fid,flag') : opt@(oid,opt') : rest) | flag' `matches` oFlagRegex = do when (opt' `notElem` longOptions) $ warnMsg oid $ "set option " <> opt' <> " is" checkFlags (flag:rest) | otherwise = checkFlags (flag:opt:rest) checkOptions (flag:rest) = checkFlags (flag:rest) checkOptions _ = return () -- Check that each option in a sequence of flags -- (such as -aveo) is valid checkFlags (flag@(fid, flag'):rest) | startsOption flag' = do unless (flag' `matches` validFlagsRegex) $ forM_ (tail flag') $ \letter -> when (letter `notElem` optionsSet) $ warnMsg fid $ "set flag " <> ('-':letter:" is") checkOptions rest | beginsWithDoubleDash flag' = do warnMsg fid $ "set flag " <> flag' <> " is" checkOptions rest -- Either a word that doesn't start with a dash, or simply '--', -- so stop checking. | otherwise = return () checkFlags [] = return () options = "abCefhmnuvxo" optionsSet = Set.fromList options startsOption = (`matches` mkRegex "^(\\+|-[^-])") oFlagRegex = mkRegex $ "^[-+][" <> options <> "]*o$" validFlagsRegex = mkRegex $ "^[-+]([" <> options <> "]+o?|o)$" beginsWithDoubleDash = (`matches` mkRegex "^--.+$") longOptions = Set.fromList [ "allexport", "errexit", "ignoreeof", "monitor", "noclobber" , "noexec", "noglob", "nolog", "notify" , "nounset", "verbose" , "vi", "xtrace" ] bashism t@(T_SimpleCommand id _ (cmd:rest)) = let name = fromMaybe "" $ getCommandName t flags = getLeadingFlags t in do when (name `elem` unsupportedCommands) $ warnMsg id $ "'" ++ name ++ "' is" potentially $ do allowed' <- Map.lookup name allowedFlags allowed <- allowed' (word, flag) <- listToMaybe $ filter (\x -> (not . null . snd $ x) && snd x `notElem` allowed) flags return . warnMsg (getId word) $ name ++ " -" ++ flag ++ " is" when (name == "source") $ warnMsg id "'source' in place of '.' is" when (name == "trap") $ let check token = potentially $ do str <- getLiteralString token let upper = map toUpper str return $ do when (upper `elem` ["ERR", "DEBUG", "RETURN"]) $ warnMsg (getId token) $ "trapping " ++ str ++ " is" when ("SIG" `isPrefixOf` upper) $ warnMsg (getId token) "prefixing signal names with 'SIG' is" when (not isDash && upper /= str) $ warnMsg (getId token) "using lower/mixed case for signal names is" in mapM_ check (drop 1 rest) when (name == "printf") $ potentially $ do format <- rest !!! 0 -- flags are covered by allowedFlags let literal = onlyLiteralString format guard $ "%q" `isInfixOf` literal return $ warnMsg (getId format) "printf %q is" where unsupportedCommands = [ "let", "caller", "builtin", "complete", "compgen", "declare", "dirs", "disown", "enable", "mapfile", "readarray", "pushd", "popd", "shopt", "suspend", "typeset" ] ++ if not isDash then ["local"] else [] allowedFlags = Map.fromList [ ("cd", Just ["L", "P"]), ("exec", Just []), ("export", Just ["p"]), ("hash", Just $ if isDash then ["r", "v"] else ["r"]), ("jobs", Just ["l", "p"]), ("printf", Just []), ("read", Just $ if isDash then ["r", "p"] else ["r"]), ("readonly", Just ["p"]), ("trap", Just []), ("type", Just []), ("ulimit", if isDash then Nothing else Just ["f"]), ("umask", Just ["S"]), ("unset", Just ["f", "v"]), ("wait", Just []) ] bashism t@(T_SourceCommand id src _) = let name = fromMaybe "" $ getCommandName src in when (name == "source") $ warnMsg id "'source' in place of '.' is" bashism (TA_Expansion _ (T_Literal id str : _)) | str `matches` radix = when (str `matches` radix) $ warnMsg id "arithmetic base conversion is" where radix = mkRegex "^[0-9]+#" bashism _ = return () varChars="_0-9a-zA-Z" expansion = let re = mkRegex in [ (re $ "^![" ++ varChars ++ "]", "indirect expansion is"), (re $ "^[" ++ varChars ++ "]+\\[.*\\]$", "array references are"), (re $ "^![" ++ varChars ++ "]+\\[[*@]]$", "array key expansion is"), (re $ "^![" ++ varChars ++ "]+[*@]$", "name matching prefixes are"), (re $ "^[" ++ varChars ++ "*@]+:[^-=?+]", "string indexing is"), (re $ "^([*@][%#]|#[@*])", "string operations on $@/$* are"), (re $ "^[" ++ varChars ++ "*@]+(\\[.*\\])?/", "string replacement is") ] bashVars = [ "OSTYPE", "MACHTYPE", "HOSTTYPE", "HOSTNAME", "DIRSTACK", "EUID", "UID", "SHLVL", "PIPESTATUS", "SHELLOPTS", "_" ] bashDynamicVars = [ "RANDOM", "SECONDS" ] dashVars = [ "_" ] isBashVariable var = (var `elem` bashDynamicVars || var `elem` bashVars && not (isAssigned var)) && not (isDash && var `elem` dashVars) isAssigned var = any f (variableFlow params) where f x = case x of Assignment (_, _, name, _) -> name == var _ -> False prop_checkEchoSed1 = verify checkEchoSed "FOO=$(echo \"$cow\" | sed 's/foo/bar/g')" prop_checkEchoSed1b= verify checkEchoSed "FOO=$(sed 's/foo/bar/g' <<< \"$cow\")" prop_checkEchoSed2 = verify checkEchoSed "rm $(echo $cow | sed -e 's,foo,bar,')" prop_checkEchoSed2b= verify checkEchoSed "rm $(sed -e 's,foo,bar,' <<< $cow)" checkEchoSed = ForShell [Bash, Ksh] f where f (T_Redirecting id lefts r) = when (any redirectHereString lefts) $ checkSed id rcmd where redirectHereString :: Token -> Bool redirectHereString t = case t of (T_FdRedirect _ _ T_HereString{}) -> True _ -> False rcmd = oversimplify r f (T_Pipeline id _ [a, b]) = when (acmd == ["echo", "${VAR}"]) $ checkSed id bcmd where acmd = oversimplify a bcmd = oversimplify b f _ = return () checkSed id ["sed", v] = checkIn id v checkSed id ["sed", "-e", v] = checkIn id v checkSed _ _ = return () -- This should have used backreferences, but TDFA doesn't support them sedRe = mkRegex "^s(.)([^\n]*)g?$" isSimpleSed s = fromMaybe False $ do [first,rest] <- matchRegex sedRe s let delimiters = filter (== head first) rest guard $ length delimiters == 2 return True checkIn id s = when (isSimpleSed s) $ style id 2001 "See if you can use ${variable//search/replace} instead." prop_checkBraceExpansionVars1 = verify checkBraceExpansionVars "echo {1..$n}" prop_checkBraceExpansionVars2 = verifyNot checkBraceExpansionVars "echo {1,3,$n}" prop_checkBraceExpansionVars3 = verify checkBraceExpansionVars "eval echo DSC{0001..$n}.jpg" prop_checkBraceExpansionVars4 = verify checkBraceExpansionVars "echo {$i..100}" checkBraceExpansionVars = ForShell [Bash] f where f t@(T_BraceExpansion id list) = mapM_ check list where check element = when (any (`isInfixOf` toString element) ["$..", "..$"]) $ do c <- isEvaled element if c then style id 2175 "Quote this invalid brace expansion since it should be passed literally to eval." else warn id 2051 "Bash doesn't support variables in brace range expansions." f _ = return () literalExt t = case t of T_DollarBraced {} -> return "$" T_DollarExpansion {} -> return "$" T_DollarArithmetic {} -> return "$" otherwise -> return "-" toString t = fromJust $ getLiteralStringExt literalExt t isEvaled t = do cmd <- getClosestCommandM t return $ isJust cmd && fromJust cmd `isUnqualifiedCommand` "eval" prop_checkMultiDimensionalArrays1 = verify checkMultiDimensionalArrays "foo[a][b]=3" prop_checkMultiDimensionalArrays2 = verifyNot checkMultiDimensionalArrays "foo[a]=3" prop_checkMultiDimensionalArrays3 = verify checkMultiDimensionalArrays "foo=( [a][b]=c )" prop_checkMultiDimensionalArrays4 = verifyNot checkMultiDimensionalArrays "foo=( [a]=c )" prop_checkMultiDimensionalArrays5 = verify checkMultiDimensionalArrays "echo ${foo[bar][baz]}" prop_checkMultiDimensionalArrays6 = verifyNot checkMultiDimensionalArrays "echo ${foo[bar]}" checkMultiDimensionalArrays = ForShell [Bash] f where f token = case token of T_Assignment _ _ name (first:second:_) _ -> about second T_IndexedElement _ (first:second:_) _ -> about second T_DollarBraced {} -> when (isMultiDim token) $ about token _ -> return () about t = warn (getId t) 2180 "Bash does not support multidimensional arrays. Use 1D or associative arrays." re = mkRegex "^\\[.*\\]\\[.*\\]" -- Fixme, this matches ${foo:- [][]} and such as well isMultiDim t = getBracedModifier (bracedString t) `matches` re prop_checkPS11 = verify checkPS1Assignments "PS1='\\033[1;35m\\$ '" prop_checkPS11a= verify checkPS1Assignments "export PS1='\\033[1;35m\\$ '" prop_checkPSf2 = verify checkPS1Assignments "PS1='\\h \\e[0m\\$ '" prop_checkPS13 = verify checkPS1Assignments "PS1=$'\\x1b[c '" prop_checkPS14 = verify checkPS1Assignments "PS1=$'\\e[3m; '" prop_checkPS14a= verify checkPS1Assignments "export PS1=$'\\e[3m; '" prop_checkPS15 = verifyNot checkPS1Assignments "PS1='\\[\\033[1;35m\\]\\$ '" prop_checkPS16 = verifyNot checkPS1Assignments "PS1='\\[\\e1m\\e[1m\\]\\$ '" prop_checkPS17 = verifyNot checkPS1Assignments "PS1='e033x1B'" prop_checkPS18 = verifyNot checkPS1Assignments "PS1='\\[\\e\\]'" checkPS1Assignments = ForShell [Bash] f where f token = case token of (T_Assignment _ _ "PS1" _ word) -> warnFor word _ -> return () warnFor word = let contents = concat $ oversimplify word in when (containsUnescaped contents) $ info (getId word) 2025 "Make sure all escape sequences are enclosed in \\[..\\] to prevent line wrapping issues" containsUnescaped s = let unenclosed = subRegex enclosedRegex s "" in isJust $ matchRegex escapeRegex unenclosed enclosedRegex = mkRegex "\\\\\\[.*\\\\\\]" -- FIXME: shouldn't be eager escapeRegex = mkRegex "\\\\x1[Bb]|\\\\e|\x1B|\\\\033" return [] runTests = $( [| $(forAllProperties) (quickCheckWithResult (stdArgs { maxSuccess = 1 }) ) |]) ShellCheck-0.7.0/src/ShellCheck/Formatter/0000755000000000000000000000000013517444075016462 5ustar0000000000000000ShellCheck-0.7.0/src/ShellCheck/Formatter/Format.hs0000644000000000000000000000456613517444075020261 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.Format where import ShellCheck.Data import ShellCheck.Interface import ShellCheck.Fixer import Control.Monad import Data.Array import Data.List import System.IO import System.Info -- A formatter that carries along an arbitrary piece of data data Formatter = Formatter { header :: IO (), onResult :: CheckResult -> SystemInterface IO -> IO (), onFailure :: FilePath -> ErrorMessage -> IO (), footer :: IO () } sourceFile = posFile . pcStartPos lineNo = posLine . pcStartPos endLineNo = posLine . pcEndPos colNo = posColumn . pcStartPos endColNo = posColumn . pcEndPos codeNo = cCode . pcComment messageText = cMessage . pcComment severityText :: PositionedComment -> String severityText pc = case cSeverity (pcComment pc) of ErrorC -> "error" WarningC -> "warning" InfoC -> "info" StyleC -> "style" -- Realign comments from a tabstop of 8 to 1 makeNonVirtual comments contents = map fix comments where list = lines contents arr = listArray (1, length list) list untabbedFix f = newFix { fixReplacements = map (\r -> removeTabStops r arr) (fixReplacements f) } fix c = (removeTabStops c arr) { pcFix = fmap untabbedFix (pcFix c) } shouldOutputColor :: ColorOption -> IO Bool shouldOutputColor colorOption = do term <- hIsTerminalDevice stdout let windows = "mingw" `isPrefixOf` os let isUsableTty = term && not windows let useColor = case colorOption of ColorAlways -> True ColorNever -> False ColorAuto -> isUsableTty return useColor ShellCheck-0.7.0/src/ShellCheck/Formatter/CheckStyle.hs0000644000000000000000000000532313517444075021057 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.CheckStyle (format) where import ShellCheck.Interface import ShellCheck.Formatter.Format import Data.Char import Data.List import GHC.Exts import System.IO format :: IO Formatter format = return Formatter { header = do putStrLn "" putStrLn "", onFailure = outputError, onResult = outputResults, footer = putStrLn "" } outputResults cr sys = if null comments then outputFile (crFilename cr) "" [] else mapM_ outputGroup fileGroups where comments = crComments cr fileGroups = groupWith sourceFile comments outputGroup group = do let filename = sourceFile (head group) result <- (siReadFile sys) filename let contents = either (const "") id result outputFile filename contents group outputFile filename contents warnings = do let comments = makeNonVirtual warnings contents putStrLn . formatFile filename $ comments formatFile name comments = concat [ "\n", concatMap formatComment comments, "" ] formatComment c = concat [ "\n" ] outputError file error = putStrLn $ concat [ "\n", "\n", "" ] attr s v = concat [ s, "='", escape v, "' " ] escape = concatMap escape' escape' c = if isOk c then [c] else "&#" ++ show (ord c) ++ ";" isOk x = any ($x) [isAsciiUpper, isAsciiLower, isDigit, (`elem` " ./")] severity "error" = "error" severity "warning" = "warning" severity _ = "info" ShellCheck-0.7.0/src/ShellCheck/Formatter/Diff.hs0000644000000000000000000002112513517444075017667 0ustar0000000000000000{- Copyright 2019 Vidar 'koala_man' Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} {-# LANGUAGE TemplateHaskell #-} module ShellCheck.Formatter.Diff (format, ShellCheck.Formatter.Diff.runTests) where import ShellCheck.Interface import ShellCheck.Fixer import ShellCheck.Formatter.Format import Control.Monad import Data.Algorithm.Diff import Data.Array import Data.IORef import Data.List import qualified Data.Monoid as Monoid import Data.Maybe import qualified Data.Map as M import GHC.Exts (sortWith) import System.IO import System.FilePath import Test.QuickCheck import Debug.Trace ltt x = trace (show x) x format :: FormatterOptions -> IO Formatter format options = do didOutput <- newIORef False shouldColor <- shouldOutputColor (foColorOption options) let color = if shouldColor then colorize else nocolor return Formatter { header = return (), footer = checkFooter didOutput color, onFailure = reportFailure color, onResult = reportResult didOutput color } contextSize = 3 red = 31 green = 32 yellow = 33 cyan = 36 bold = 1 nocolor n = id colorize n s = (ansi n) ++ s ++ (ansi 0) ansi n = "\x1B[" ++ show n ++ "m" printErr :: ColorFunc -> String -> IO () printErr color = hPutStrLn stderr . color bold . color red reportFailure color file msg = printErr color $ file ++ ": " ++ msg checkFooter didOutput color = do output <- readIORef didOutput unless output $ printErr color "Issues were detected, but none were auto-fixable. Use another format to see them." type ColorFunc = (Int -> String -> String) data LFStatus = LinefeedMissing | LinefeedOk data DiffDoc a = DiffDoc String LFStatus [DiffRegion a] data DiffRegion a = DiffRegion (Int, Int) (Int, Int) [Diff a] reportResult :: (IORef Bool) -> ColorFunc -> CheckResult -> SystemInterface IO -> IO () reportResult didOutput color result sys = do let comments = crComments result let suggestedFixes = mapMaybe pcFix comments let fixmap = buildFixMap suggestedFixes mapM_ output $ M.toList fixmap where output (name, fix) = do file <- (siReadFile sys) name case file of Right contents -> do putStrLn $ formatDoc color $ makeDiff name contents fix writeIORef didOutput True Left msg -> reportFailure color name msg hasTrailingLinefeed str = case str of [] -> True _ -> last str == '\n' coversLastLine regions = case regions of [] -> False _ -> (fst $ last regions) -- TODO: Factor this out into a unified diff library because we're doing a lot -- of the heavy lifting anyways. makeDiff :: String -> String -> Fix -> DiffDoc String makeDiff name contents fix = do let hunks = groupDiff $ computeDiff contents fix let lf = if coversLastLine hunks && not (hasTrailingLinefeed contents) then LinefeedMissing else LinefeedOk DiffDoc name lf $ findRegions hunks computeDiff :: String -> Fix -> [Diff String] computeDiff contents fix = let old = lines contents array = listArray (1, fromIntegral $ (length old)) old new = applyFix fix array in getDiff old new -- Group changes into hunks groupDiff :: [Diff a] -> [(Bool, [Diff a])] groupDiff = filter (\(_, l) -> not (null l)) . hunt [] where -- Churn through 'Both's until we find a difference hunt current [] = [(False, reverse current)] hunt current (x@Both {}:rest) = hunt (x:current) rest hunt current list = let (context, previous) = splitAt contextSize current in (False, reverse previous) : gather context 0 list -- Pick out differences until we find a run of Both's gather current n [] = let (extras, patch) = splitAt (max 0 $ n - contextSize) current in [(True, reverse patch), (False, reverse extras)] gather current n list@(Both {}:_) | n == contextSize*2 = let (context, previous) = splitAt contextSize current in (True, reverse previous) : hunt context list gather current n (x@Both {}:rest) = gather (x:current) (n+1) rest gather current n (x:rest) = gather (x:current) 0 rest -- Get line numbers for hunks findRegions :: [(Bool, [Diff String])] -> [DiffRegion String] findRegions = find' 1 1 where find' _ _ [] = [] find' left right ((output, run):rest) = let (dl, dr) = countDelta run remainder = find' (left+dl) (right+dr) rest in if output then DiffRegion (left, dl) (right, dr) run : remainder else remainder -- Get left/right line counts for a hunk countDelta :: [Diff a] -> (Int, Int) countDelta = count' 0 0 where count' left right [] = (left, right) count' left right (x:rest) = case x of Both {} -> count' (left+1) (right+1) rest First {} -> count' (left+1) right rest Second {} -> count' left (right+1) rest formatRegion :: ColorFunc -> LFStatus -> DiffRegion String -> String formatRegion color lf (DiffRegion left right diffs) = let header = color cyan ("@@ -" ++ (tup left) ++ " +" ++ (tup right) ++" @@") in unlines $ header : reverse (getStrings lf (reverse diffs)) where noLF = "\\ No newline at end of file" getStrings LinefeedOk list = map format list getStrings LinefeedMissing list@((Both _ _):_) = noLF : map format list getStrings LinefeedMissing list@((First _):_) = noLF : map format list getStrings LinefeedMissing (last:rest) = format last : getStrings LinefeedMissing rest tup (a,b) = (show a) ++ "," ++ (show b) format (Both x _) = ' ':x format (First x) = color red $ '-':x format (Second x) = color green $ '+':x splitLast [] = ([], []) splitLast x = let (last, rest) = splitAt 1 $ reverse x in (reverse rest, last) formatDoc color (DiffDoc name lf regions) = let (most, last) = splitLast regions in (color bold $ "--- " ++ ("a" name)) ++ "\n" ++ (color bold $ "+++ " ++ ("b" name)) ++ "\n" ++ concatMap (formatRegion color LinefeedOk) most ++ concatMap (formatRegion color lf) last -- Create a Map from filename to Fix buildFixMap :: [Fix] -> M.Map String Fix buildFixMap fixes = perFile where splitFixes = concatMap splitFixByFile fixes perFile = groupByMap (posFile . repStartPos . head . fixReplacements) splitFixes -- There are currently no multi-file fixes, but let's handle it anyways splitFixByFile :: Fix -> [Fix] splitFixByFile fix = map makeFix $ groupBy sameFile (fixReplacements fix) where sameFile rep1 rep2 = (posFile $ repStartPos rep1) == (posFile $ repStartPos rep2) makeFix reps = newFix { fixReplacements = reps } groupByMap :: (Ord k, Monoid v) => (v -> k) -> [v] -> M.Map k v groupByMap f = M.fromListWith Monoid.mappend . map (\x -> (f x, x)) -- For building unit tests b n = Both n n l = First r = Second prop_identifiesProperContext = groupDiff [b 1, b 2, b 3, b 4, l 5, b 6, b 7, b 8, b 9] == [(False, [b 1]), -- Omitted (True, [b 2, b 3, b 4, l 5, b 6, b 7, b 8]), -- A change with three lines of context (False, [b 9])] -- Omitted prop_includesContextFromStartIfNecessary = groupDiff [b 4, l 5, b 6, b 7, b 8, b 9] == [ -- Nothing omitted (True, [b 4, l 5, b 6, b 7, b 8]), -- A change with three lines of context (False, [b 9])] -- Omitted prop_includesContextUntilEndIfNecessary = groupDiff [b 4, l 5] == [ -- Nothing omitted (True, [b 4, l 5]) ] -- Nothing Omitted prop_splitsIntoMultipleHunks = groupDiff [l 1, b 1, b 2, b 3, b 4, b 5, b 6, b 7, r 8] == [ -- Nothing omitted (True, [l 1, b 1, b 2, b 3]), (False, [b 4]), (True, [b 5, b 6, b 7, r 8]) ] -- Nothing Omitted prop_splitsIntoMultipleHunksUnlessTouching = groupDiff [l 1, b 1, b 2, b 3, b 4, b 5, b 6, r 7] == [ (True, [l 1, b 1, b 2, b 3, b 4, b 5, b 6, r 7]) ] prop_countDeltasWorks = countDelta [b 1, l 2, r 3, r 4, b 5] == (3,4) prop_countDeltasWorks2 = countDelta [] == (0,0) return [] runTests = $quickCheckAll ShellCheck-0.7.0/src/ShellCheck/Formatter/GCC.hs0000644000000000000000000000364113517444075017416 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.GCC (format) where import ShellCheck.Interface import ShellCheck.Formatter.Format import Data.List import GHC.Exts import System.IO format :: IO Formatter format = return Formatter { header = return (), footer = return (), onFailure = outputError, onResult = outputAll } outputError file error = hPutStrLn stderr $ file ++ ": " ++ error outputAll cr sys = mapM_ f groups where comments = crComments cr groups = groupWith sourceFile comments f :: [PositionedComment] -> IO () f group = do let filename = sourceFile (head group) result <- (siReadFile sys) filename let contents = either (const "") id result outputResult filename contents group outputResult filename contents warnings = do let comments = makeNonVirtual warnings contents mapM_ (putStrLn . formatComment filename) comments formatComment filename c = concat [ filename, ":", show $ lineNo c, ":", show $ colNo c, ": ", case severityText c of "error" -> "error" "warning" -> "warning" _ -> "note", ": ", concat . lines $ messageText c, " [SC", show $ codeNo c, "]" ] ShellCheck-0.7.0/src/ShellCheck/Formatter/JSON.hs0000644000000000000000000000630113517444075017567 0ustar0000000000000000{-# LANGUAGE OverloadedStrings #-} {- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.JSON (format) where import ShellCheck.Interface import ShellCheck.Formatter.Format import Data.Aeson import Data.IORef import Data.Monoid import GHC.Exts import System.IO import qualified Data.ByteString.Lazy.Char8 as BL format :: IO Formatter format = do ref <- newIORef [] return Formatter { header = return (), onResult = collectResult ref, onFailure = outputError, footer = finish ref } instance ToJSON Replacement where toJSON replacement = let start = repStartPos replacement end = repEndPos replacement str = repString replacement in object [ "precedence" .= repPrecedence replacement, "insertionPoint" .= case repInsertionPoint replacement of InsertBefore -> "beforeStart" :: String InsertAfter -> "afterEnd", "line" .= posLine start, "column" .= posColumn start, "endLine" .= posLine end, "endColumn" .= posColumn end, "replacement" .= str ] instance ToJSON PositionedComment where toJSON comment = let start = pcStartPos comment end = pcEndPos comment c = pcComment comment in object [ "file" .= posFile start, "line" .= posLine start, "endLine" .= posLine end, "column" .= posColumn start, "endColumn" .= posColumn end, "level" .= severityText comment, "code" .= cCode c, "message" .= cMessage c, "fix" .= pcFix comment ] toEncoding comment = let start = pcStartPos comment end = pcEndPos comment c = pcComment comment in pairs ( "file" .= posFile start <> "line" .= posLine start <> "endLine" .= posLine end <> "column" .= posColumn start <> "endColumn" .= posColumn end <> "level" .= severityText comment <> "code" .= cCode c <> "message" .= cMessage c <> "fix" .= pcFix comment ) instance ToJSON Fix where toJSON fix = object [ "replacements" .= fixReplacements fix ] outputError file msg = hPutStrLn stderr $ file ++ ": " ++ msg collectResult ref cr sys = mapM_ f groups where comments = crComments cr groups = groupWith sourceFile comments f :: [PositionedComment] -> IO () f group = modifyIORef ref (\x -> comments ++ x) finish ref = do list <- readIORef ref BL.putStrLn $ encode list ShellCheck-0.7.0/src/ShellCheck/Formatter/JSON1.hs0000644000000000000000000000727413517444075017662 0ustar0000000000000000{-# LANGUAGE OverloadedStrings #-} {- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.JSON1 (format) where import ShellCheck.Interface import ShellCheck.Formatter.Format import Data.Aeson import Data.IORef import Data.Monoid import GHC.Exts import System.IO import qualified Data.ByteString.Lazy.Char8 as BL format :: IO Formatter format = do ref <- newIORef [] return Formatter { header = return (), onResult = collectResult ref, onFailure = outputError, footer = finish ref } data Json1Output = Json1Output { comments :: [PositionedComment] } instance ToJSON Json1Output where toJSON result = object [ "comments" .= comments result ] toEncoding result = pairs ( "comments" .= comments result ) instance ToJSON Replacement where toJSON replacement = let start = repStartPos replacement end = repEndPos replacement str = repString replacement in object [ "precedence" .= repPrecedence replacement, "insertionPoint" .= case repInsertionPoint replacement of InsertBefore -> "beforeStart" :: String InsertAfter -> "afterEnd", "line" .= posLine start, "column" .= posColumn start, "endLine" .= posLine end, "endColumn" .= posColumn end, "replacement" .= str ] instance ToJSON PositionedComment where toJSON comment = let start = pcStartPos comment end = pcEndPos comment c = pcComment comment in object [ "file" .= posFile start, "line" .= posLine start, "endLine" .= posLine end, "column" .= posColumn start, "endColumn" .= posColumn end, "level" .= severityText comment, "code" .= cCode c, "message" .= cMessage c, "fix" .= pcFix comment ] toEncoding comment = let start = pcStartPos comment end = pcEndPos comment c = pcComment comment in pairs ( "file" .= posFile start <> "line" .= posLine start <> "endLine" .= posLine end <> "column" .= posColumn start <> "endColumn" .= posColumn end <> "level" .= severityText comment <> "code" .= cCode c <> "message" .= cMessage c <> "fix" .= pcFix comment ) instance ToJSON Fix where toJSON fix = object [ "replacements" .= fixReplacements fix ] outputError file msg = hPutStrLn stderr $ file ++ ": " ++ msg collectResult ref cr sys = mapM_ f groups where comments = crComments cr groups = groupWith sourceFile comments f :: [PositionedComment] -> IO () f group = do let filename = sourceFile (head group) result <- siReadFile sys filename let contents = either (const "") id result let comments' = makeNonVirtual comments contents modifyIORef ref (\x -> comments' ++ x) finish ref = do list <- readIORef ref BL.putStrLn $ encode $ Json1Output { comments = list } ShellCheck-0.7.0/src/ShellCheck/Formatter/TTY.hs0000644000000000000000000001565213517444075017507 0ustar0000000000000000{- Copyright 2012-2019 Vidar Holen This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.TTY (format) where import ShellCheck.Fixer import ShellCheck.Interface import ShellCheck.Formatter.Format import Control.Monad import Data.Array import Data.Foldable import Data.Ord import Data.IORef import Data.List import Data.Maybe import GHC.Exts import System.IO import System.Info wikiLink = "https://www.shellcheck.net/wiki/" -- An arbitrary Ord thing to order warnings type Ranking = (Char, Severity, Integer) -- Ansi coloring function type ColorFunc = (String -> String -> String) format :: FormatterOptions -> IO Formatter format options = do topErrorRef <- newIORef [] return Formatter { header = return (), footer = outputWiki topErrorRef, onFailure = outputError options, onResult = outputResult options topErrorRef } colorForLevel level = case level of "error" -> 31 -- red "warning" -> 33 -- yellow "info" -> 32 -- green "style" -> 32 -- green "verbose" -> 32 -- green "message" -> 1 -- bold "source" -> 0 -- none _ -> 0 -- none rankError :: PositionedComment -> Ranking rankError err = (ranking, cSeverity $ pcComment err, cCode $ pcComment err) where ranking = if cCode (pcComment err) `elem` uninteresting then 'Z' else 'A' -- A list of the most generic, least directly helpful -- error codes to downrank. uninteresting = [ 1009, -- Mentioned parser error was.. 1019, -- Expected this to be an argument 1036, -- ( is invalid here 1047, -- Expected 'fi' 1062, -- Expected 'done' 1070, -- Parsing stopped here (generic) 1072, -- Missing/unexpected .. 1073, -- Couldn't parse this .. 1088, -- Parsing stopped here (paren) 1089 -- Parsing stopped here (keyword) ] appendComments errRef comments max = do previous <- readIORef errRef let current = map (\x -> (rankError x, cCode $ pcComment x, cMessage $ pcComment x)) comments writeIORef errRef . take max . nubBy equal . sort $ previous ++ current where fst3 (x,_,_) = x equal x y = fst3 x == fst3 y outputWiki :: IORef [(Ranking, Integer, String)] -> IO () outputWiki errRef = do issues <- readIORef errRef unless (null issues) $ do putStrLn "For more information:" mapM_ showErr issues where showErr (_, code, msg) = putStrLn $ " " ++ wikiLink ++ "SC" ++ show code ++ " -- " ++ shorten msg limit = 36 shorten msg = if length msg < limit then msg else (take (limit-3) msg) ++ "..." outputError options file error = do color <- getColorFunc $ foColorOption options hPutStrLn stderr $ color "error" $ file ++ ": " ++ error outputResult options ref result sys = do color <- getColorFunc $ foColorOption options let comments = crComments result appendComments ref comments (fromIntegral $ foWikiLinkCount options) let fileGroups = groupWith sourceFile comments mapM_ (outputForFile color sys) fileGroups outputForFile color sys comments = do let fileName = sourceFile (head comments) result <- (siReadFile sys) fileName let contents = either (const "") id result let fileLinesList = lines contents let lineCount = length fileLinesList let fileLines = listArray (1, lineCount) fileLinesList let groups = groupWith lineNo comments mapM_ (\commentsForLine -> do let lineNum = fromIntegral $ lineNo (head commentsForLine) let line = if lineNum < 1 || lineNum > lineCount then "" else fileLines ! fromIntegral lineNum putStrLn "" putStrLn $ color "message" $ "In " ++ fileName ++" line " ++ show lineNum ++ ":" putStrLn (color "source" line) mapM_ (\c -> putStrLn (color (severityText c) $ cuteIndent c)) commentsForLine putStrLn "" showFixedString color commentsForLine (fromIntegral lineNum) fileLines ) groups -- Pick out only the lines necessary to show a fix in action sliceFile :: Fix -> Array Int String -> (Fix, Array Int String) sliceFile fix lines = (mapPositions adjust fix, sliceLines lines) where (minLine, maxLine) = foldl (\(mm, mx) pos -> ((min mm $ fromIntegral $ posLine pos), (max mx $ fromIntegral $ posLine pos))) (maxBound, minBound) $ concatMap (\x -> [repStartPos x, repEndPos x]) $ fixReplacements fix sliceLines :: Array Int String -> Array Int String sliceLines = ixmap (1, maxLine - minLine + 1) (\x -> x + minLine - 1) adjust pos = pos { posLine = posLine pos - (fromIntegral minLine) + 1 } showFixedString :: ColorFunc -> [PositionedComment] -> Int -> Array Int String -> IO () showFixedString color comments lineNum fileLines = let line = fileLines ! fromIntegral lineNum in case mapMaybe pcFix comments of [] -> return () fixes -> do -- Folding automatically removes overlap let mergedFix = fold fixes -- We show the complete, associated fixes, whether or not it includes this -- and/or other unrelated lines. let (excerptFix, excerpt) = sliceFile mergedFix fileLines -- in the spirit of error prone putStrLn $ color "message" "Did you mean: " putStrLn $ unlines $ applyFix excerptFix excerpt cuteIndent :: PositionedComment -> String cuteIndent comment = replicate (fromIntegral $ colNo comment - 1) ' ' ++ makeArrow ++ " " ++ code (codeNo comment) ++ ": " ++ messageText comment where arrow n = '^' : replicate (fromIntegral $ n-2) '-' ++ "^" makeArrow = let sameLine = lineNo comment == endLineNo comment delta = endColNo comment - colNo comment in if sameLine && delta > 2 && delta < 32 then arrow delta else "^--" code num = "SC" ++ show num getColorFunc :: ColorOption -> IO ColorFunc getColorFunc colorOption = do useColor <- shouldOutputColor colorOption return $ if useColor then colorComment else const id where colorComment level comment = ansi (colorForLevel level) ++ comment ++ clear clear = ansi 0 ansi n = "\x1B[" ++ show n ++ "m" ShellCheck-0.7.0/src/ShellCheck/Formatter/Quiet.hs0000644000000000000000000000225613517444075020112 0ustar0000000000000000{- Copyright 2019 Austin Voecks This file is part of ShellCheck. https://www.shellcheck.net ShellCheck is free software: you can redistribute it and/or modify it under the terms of the GNU General Public License as published by the Free Software Foundation, either version 3 of the License, or (at your option) any later version. ShellCheck is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License for more details. You should have received a copy of the GNU General Public License along with this program. If not, see . -} module ShellCheck.Formatter.Quiet (format) where import ShellCheck.Interface import ShellCheck.Formatter.Format import Control.Monad import Data.IORef import System.Exit format :: FormatterOptions -> IO Formatter format options = return Formatter { header = return (), footer = return (), onFailure = \ _ _ -> exitFailure, onResult = \ result _ -> unless (null $ crComments result) exitFailure } ShellCheck-0.7.0/test/0000755000000000000000000000000013517444075012702 5ustar0000000000000000ShellCheck-0.7.0/test/shellcheck.hs0000644000000000000000000000165413517444075015351 0ustar0000000000000000module Main where import Control.Monad import System.Exit import qualified ShellCheck.Analytics import qualified ShellCheck.AnalyzerLib import qualified ShellCheck.Checker import qualified ShellCheck.Checks.Commands import qualified ShellCheck.Checks.Custom import qualified ShellCheck.Checks.ShellSupport import qualified ShellCheck.Fixer import qualified ShellCheck.Formatter.Diff import qualified ShellCheck.Parser main = do putStrLn "Running ShellCheck tests..." results <- sequence [ ShellCheck.Analytics.runTests ,ShellCheck.AnalyzerLib.runTests ,ShellCheck.Checker.runTests ,ShellCheck.Checks.Commands.runTests ,ShellCheck.Checks.Custom.runTests ,ShellCheck.Checks.ShellSupport.runTests ,ShellCheck.Fixer.runTests ,ShellCheck.Formatter.Diff.runTests ,ShellCheck.Parser.runTests ] if and results then exitSuccess else exitFailure