mirror of
				https://github.com/koalaman/shellcheck.git
				synced 2025-11-04 18:28:23 +08:00 
			
		
		
		
	Merge pull request #3037 from ember91/master
Fix typos and trailing whitespace
This commit is contained in:
		@@ -206,7 +206,7 @@ pattern T_Annotation id anns t = OuterToken id (Inner_T_Annotation anns t)
 | 
			
		||||
pattern T_Arithmetic id c = OuterToken id (Inner_T_Arithmetic c)
 | 
			
		||||
pattern T_Array id t = OuterToken id (Inner_T_Array t)
 | 
			
		||||
pattern TA_Sequence id l = OuterToken id (Inner_TA_Sequence l)
 | 
			
		||||
pattern TA_Parentesis id t = OuterToken id (Inner_TA_Parenthesis t)
 | 
			
		||||
pattern TA_Parenthesis id t = OuterToken id (Inner_TA_Parenthesis t)
 | 
			
		||||
pattern T_Assignment id mode var indices value = OuterToken id (Inner_T_Assignment mode var indices value)
 | 
			
		||||
pattern TA_Trinary id t1 t2 t3 = OuterToken id (Inner_TA_Trinary t1 t2 t3)
 | 
			
		||||
pattern TA_Unary id op t1 = OuterToken id (Inner_TA_Unary op t1)
 | 
			
		||||
@@ -259,7 +259,7 @@ pattern T_Subshell id l = OuterToken id (Inner_T_Subshell l)
 | 
			
		||||
pattern T_UntilExpression id c l = OuterToken id (Inner_T_UntilExpression c l)
 | 
			
		||||
pattern T_WhileExpression id c l = OuterToken id (Inner_T_WhileExpression c l)
 | 
			
		||||
 | 
			
		||||
{-# COMPLETE T_AND_IF, T_Bang, T_Case, TC_Empty, T_CLOBBER, T_DGREAT, T_DLESS, T_DLESSDASH, T_Do, T_DollarSingleQuoted, T_Done, T_DSEMI, T_Elif, T_Else, T_EOF, T_Esac, T_Fi, T_For, T_Glob, T_GREATAND, T_Greater, T_If, T_In, T_Lbrace, T_Less, T_LESSAND, T_LESSGREAT, T_Literal, T_Lparen, T_NEWLINE, T_OR_IF, T_ParamSubSpecialChar, T_Pipe, T_Rbrace, T_Rparen, T_Select, T_Semi, T_SingleQuoted, T_Then, T_UnparsedIndex, T_Until, T_While, TA_Assignment, TA_Binary, TA_Expansion, T_AndIf, T_Annotation, T_Arithmetic, T_Array, TA_Sequence, TA_Parentesis, T_Assignment, TA_Trinary, TA_Unary, TA_Variable, T_Backgrounded, T_Backticked, T_Banged, T_BatsTest, T_BraceExpansion, T_BraceGroup, TC_And, T_CaseExpression, TC_Binary, TC_Group, TC_Nullary, T_Condition, T_CoProcBody, T_CoProc, TC_Or, TC_Unary, T_DollarArithmetic, T_DollarBraceCommandExpansion, T_DollarBraced, T_DollarBracket, T_DollarDoubleQuoted, T_DollarExpansion, T_DoubleQuoted, T_Extglob, T_FdRedirect, T_ForArithmetic, T_ForIn, T_Function, T_HereDoc, T_HereString, T_IfExpression, T_Include, T_IndexedElement, T_IoDuplicate, T_IoFile, T_NormalWord, T_OrIf, T_Pipeline, T_ProcSub, T_Redirecting, T_Script, T_SelectIn, T_SimpleCommand, T_SourceCommand, T_Subshell, T_UntilExpression, T_WhileExpression #-}
 | 
			
		||||
{-# COMPLETE T_AND_IF, T_Bang, T_Case, TC_Empty, T_CLOBBER, T_DGREAT, T_DLESS, T_DLESSDASH, T_Do, T_DollarSingleQuoted, T_Done, T_DSEMI, T_Elif, T_Else, T_EOF, T_Esac, T_Fi, T_For, T_Glob, T_GREATAND, T_Greater, T_If, T_In, T_Lbrace, T_Less, T_LESSAND, T_LESSGREAT, T_Literal, T_Lparen, T_NEWLINE, T_OR_IF, T_ParamSubSpecialChar, T_Pipe, T_Rbrace, T_Rparen, T_Select, T_Semi, T_SingleQuoted, T_Then, T_UnparsedIndex, T_Until, T_While, TA_Assignment, TA_Binary, TA_Expansion, T_AndIf, T_Annotation, T_Arithmetic, T_Array, TA_Sequence, TA_Parenthesis, T_Assignment, TA_Trinary, TA_Unary, TA_Variable, T_Backgrounded, T_Backticked, T_Banged, T_BatsTest, T_BraceExpansion, T_BraceGroup, TC_And, T_CaseExpression, TC_Binary, TC_Group, TC_Nullary, T_Condition, T_CoProcBody, T_CoProc, TC_Or, TC_Unary, T_DollarArithmetic, T_DollarBraceCommandExpansion, T_DollarBraced, T_DollarBracket, T_DollarDoubleQuoted, T_DollarExpansion, T_DoubleQuoted, T_Extglob, T_FdRedirect, T_ForArithmetic, T_ForIn, T_Function, T_HereDoc, T_HereString, T_IfExpression, T_Include, T_IndexedElement, T_IoDuplicate, T_IoFile, T_NormalWord, T_OrIf, T_Pipeline, T_ProcSub, T_Redirecting, T_Script, T_SelectIn, T_SimpleCommand, T_SourceCommand, T_Subshell, T_UntilExpression, T_WhileExpression #-}
 | 
			
		||||
 | 
			
		||||
instance Eq Token where
 | 
			
		||||
    OuterToken _ a == OuterToken _ b = a == b
 | 
			
		||||
 
 | 
			
		||||
@@ -3294,7 +3294,7 @@ checkReturnAgainstZero params token =
 | 
			
		||||
            next@(TA_Unary _ "!" _):_ -> isOnlyTestInCommand next
 | 
			
		||||
            next@(TC_Group {}):_ -> isOnlyTestInCommand next
 | 
			
		||||
            next@(TA_Sequence _ [_]):_ -> isOnlyTestInCommand next
 | 
			
		||||
            next@(TA_Parentesis _ _):_ -> isOnlyTestInCommand next
 | 
			
		||||
            next@(TA_Parenthesis _ _):_ -> isOnlyTestInCommand next
 | 
			
		||||
            _ -> False
 | 
			
		||||
 | 
			
		||||
    -- TODO: Do better $? tracking and filter on whether
 | 
			
		||||
@@ -4990,14 +4990,14 @@ checkUnnecessaryParens params t =
 | 
			
		||||
        T_ForArithmetic _ x y z _ -> mapM_ (checkLeading "for (((x); (y); (z))) is the same as for ((x; y; z))")  [x,y,z]
 | 
			
		||||
        T_Assignment _ _ _ [t] _ -> checkLeading "a[(x)] is the same as a[x]" t
 | 
			
		||||
        T_Arithmetic _ t -> checkLeading "(( (x) )) is the same as (( x ))" t
 | 
			
		||||
        TA_Parentesis _ (TA_Sequence _ [ TA_Parentesis id _ ]) ->
 | 
			
		||||
        TA_Parenthesis _ (TA_Sequence _ [ TA_Parenthesis id _ ]) ->
 | 
			
		||||
            styleWithFix id 2322 "In arithmetic contexts, ((x)) is the same as (x). Prefer only one layer of parentheses." $ fix id
 | 
			
		||||
        _ -> return ()
 | 
			
		||||
  where
 | 
			
		||||
 | 
			
		||||
    checkLeading str t =
 | 
			
		||||
        case t of
 | 
			
		||||
            TA_Sequence _ [TA_Parentesis id _ ] -> styleWithFix id 2323 (str ++ ". Prefer not wrapping in additional parentheses.") $ fix id
 | 
			
		||||
            TA_Sequence _ [TA_Parenthesis id _ ] -> styleWithFix id 2323 (str ++ ". Prefer not wrapping in additional parentheses.") $ fix id
 | 
			
		||||
            _ -> return ()
 | 
			
		||||
 | 
			
		||||
    fix id =
 | 
			
		||||
 
 | 
			
		||||
@@ -490,7 +490,7 @@ build t = do
 | 
			
		||||
        TA_Binary _ _ a b -> sequentially [a,b]
 | 
			
		||||
        TA_Expansion _ list -> sequentially list
 | 
			
		||||
        TA_Sequence _ list -> sequentially list
 | 
			
		||||
        TA_Parentesis _ t -> build t
 | 
			
		||||
        TA_Parenthesis _ t -> build t
 | 
			
		||||
 | 
			
		||||
        TA_Trinary _ cond a b -> do
 | 
			
		||||
            condition <- build cond
 | 
			
		||||
 
 | 
			
		||||
@@ -827,7 +827,7 @@ readArithmeticContents =
 | 
			
		||||
        char ')'
 | 
			
		||||
        id <- endSpan start
 | 
			
		||||
        spacing
 | 
			
		||||
        return $ TA_Parentesis id s
 | 
			
		||||
        return $ TA_Parenthesis id s
 | 
			
		||||
 | 
			
		||||
    readArithTerm = readGroup <|> readVariable <|> readExpansion
 | 
			
		||||
 | 
			
		||||
 
 | 
			
		||||
		Reference in New Issue
	
	Block a user