Skip to content

Commit f1405f9

Browse files
committed
Update VBAexpressions.cls
1 parent ff2e52b commit f1405f9

File tree

1 file changed

+9
-8
lines changed

1 file changed

+9
-8
lines changed

src/VBAexpressions.cls

Lines changed: 9 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -42,17 +42,18 @@ Option Base 0
4242
'
4343
' Allowed expressions must follow the following grammar:
4444
'
45-
' Expression = ([{"("}] SubExpr [{Operator [{"("}] SubExpr [{")"}]}] [{")"}] | {["("] ["{"] List [{";" List}] ["}"] [")"]}
45+
' Expression = ([{"("}] SubExpr [{Operator [{"("}] SubExpr [{")"}]}] [{")"}] | {["("] ["{"] List [{";" List}] ["}"] [")"]})
4646
' SubExpr = Token [{Operator Token}]
4747
' Token = [{Unary}] Argument [(Operator | Function) ["("] [{Unary}] [Argument] [")"]]
48-
' Argument = (List | Variable | Operand)
49-
' List = "{" ["{"] SubExpr [{";" SubExpr}] ["}"] "}"
48+
' Argument = (List | Variable | Operand | Literal)
49+
' List = ["{"] ["{"] SubExpr [{";" SubExpr}] ["}"] ["}"]
5050
' Unary = "-" | "+" | ~
51-
' Operand = ({Digit} ["."] [{Digit}] ["E"("-" | "+"){Digit}] | (True | False) | "'"Alphabet"'")
51+
' Literal = (Operand | "'"Alphabet"'")
52+
' Operand = ({Digit} ["."] [{Digit}] ["E"("-" | "+"){Digit}] | (True | False))
5253
' Variable = Alphabet [{Decimal}] [{(Digit | Alphabet)}]
5354
' Alphabet = "A-Z" | "a-z"
5455
' Decimal = "."
55-
' Digit = "0-9"
56+
' Digit = "0-9"
5657
' Operator = "+" | "-" | "*" | "/" | "\" | "^" | "%" | "!" | "<" | "<=" | "<>" | ">" | ">=" | "=" | "$" | "&" | "|" | "||"
5758
' Function = "abs" | "sin" | "cos" | "min" |...|[UDF]
5859
'
@@ -5416,9 +5417,9 @@ err_Handler:
54165417
End Function
54175418

54185419
''' <summary: Least squares solution of A*X = B>
5419-
''' Returns X that minimizes the two norm of Q*R*X-B
5420-
''' @exception IllegalArgumentException Matrix row dimensions must agree.
5421-
''' @exception RuntimeException Matrix is rank deficient.
5420+
''' Returns X that minimizes the two norm of Q*R*X-B
5421+
''' @exception IllegalArgumentException Matrix row dimensions must agree.
5422+
''' @exception RuntimeException Matrix is rank deficient.
54225423
''' </summary>
54235424
''' <param name="A">Matrix of coefficients of the system variables.</param>
54245425
''' <param name="b">Right side vector.</param>

0 commit comments

Comments
 (0)