Recent posts

#91
Meta Forum / We got a new Forum for our Mem...
Last post by Theo Gottwald - April 24, 2024, 08:19:29 PM
🌟 Exciting news! We've launched a new Board for our member Frank Brübach! 🎉
He asked for it, and we made it happen! 🛠�
If you have a project and want your own sub-forum, just let us know! 📢
But here's the catch: 🚨
If the forum stays inactive for a long period and no one writes in it, it might be discontinued. ⏳
Share your thoughts and stay active! 💬
#NewForum #FrankBrübach #Projects #MemberEngagement #StayActive 🌍🚀👥💡✨




Wir haben ein neues Forum für unser Mitglied Frank Brübach eingerichtet! 🎉
Er hat danach gefragt und wir haben es möglich gemacht. 🙌

Wenn du ein Projekt hast und ein eigenes Unterforum möchtest, kannst du einfach nachfragen. 📬
Aber hier ist die Bedingung: 🚨
Wenn das Forum längere Zeit inaktiv bleibt und niemand darin schreibt, könnte es aufgegeben werden. ⏳

Teilt eure Gedanken und bleibt aktiv! 💬

#NeuesForum #FrankBrübach #Projekte #MitgliederEngagement #AktivBleiben 🌟👥📊
#92
Meta Forum / Re: Guess who just applied for...
Last post by Theo Gottwald - April 24, 2024, 07:30:23 PM
You are not alone, another Forum Member wrote:
"Yes John spikovsky is a lunatic and bad tempered guy he was kicked out of freebasic powerbasic and here ;) I would avoid stress he offended a lot of people back then"
As this is the situation i will not accept his application.
#93
OxygenBasic Examples / Re: Moveable objects qt
Last post by Frank Brübach - April 24, 2024, 02:40:28 PM
Hi Charles

It's Just an Idea how to improve or simplifier a collision for objects Made this fictive Code for consoleG  (Same example Like above)


' fictive code example only an idea for boundingbox for a cube m500 and m400
'
' This example serves for a moving the cube in discrete steps (e.g., one unit at a time)

' Movement logic for cube 500
if key_up_pressed then
    moveCube500(0, 1) ' Move up one unit at a time
elseif key_down_pressed then
    moveCube500(0, -1) ' Move down
elseif key_left_pressed then
    moveCube500(-1, 0) ' Move left
elseif key_right_pressed then
    moveCube500(1, 0) ' Move right
end if

int new_x, newy

' Function to move cube 500 and handle collision
sub moveCube500(int dx, int dy)
    ' Calculate new position
    new_x = cube500_x + dx
    new_y = cube500_y + dy
   
    ' Check for collision with cube 400
    collision = BoundingBoxIntersect(new_x, new_y, cube_width, cube_height, cube400_x, cube400_y, cube_width, cube_height)
   
    ' If no collision, update position
    if not collision then
        cube500_x = new_x
        cube500_y = new_y
    end if
end sub
#94
Meta Forum / Re: Guess who just applied for...
Last post by Charles Pegge - April 24, 2024, 02:29:10 PM
I regret to say, in the interests of all our members here, it would not be a good idea.
#95
Advanced Datatypes / Macros for using the Powerbasi...
Last post by Theo Gottwald - April 24, 2024, 10:08:33 AM
🚀 These powerful basic data objects are designed to be very versatile, which is why they use the slower variant data type.

This means they can be used for numbers as well as strings, but the downside is that they are relatively slow.

The object declaration also requires a lot of typing, but at least you can save some time with the macro below. Overall, I think this type of object data type is too slow for many things and therefore not universally applicable.
It also goes against the Power Basic principle of "smaller faster". 💡
#PowerBasic #DataTypes #Versatility #Efficiency


MACRO Make_Stack(P1) = LOCAL P1 AS ISTACKCOLLECTION:P1 = CLASS "StackCollection"  

' Usage:

LOCAL V01 AS VARIANT
LOCAL T01 AS LONG         

Make_Stack(stack)
stack.Push V01 
T01=stack.COUNT
V01=stack.Pop  


MACRO Make_Que(P1) = LOCAL P1 AS IQUEUECOLLECTION:P1 = CLASS "QueueCollection"  

' Usage:
LOCAL V01 AS VARIANT  
LOCAL T01 AS LONG         

Make_Que(queue)
queue.ENQUEUE V01
T01=queue.COUNT
V01=queue.DEQUEUE



#96
Meta Forum / Re: Guess who just applied for...
Last post by Theo Gottwald - April 24, 2024, 09:54:13 AM
Lets see if Charles agrees to give that person a chance to show up.
And show better culture then last time.
I remember that Jose blocked the person for some reasons.
However I can accept someone who may have changed over time.
I will never accept people with bad behavior or insults in this forum.
#97
Meta Forum / Re: Guess who just applied for...
Last post by Johan Klassen - April 24, 2024, 08:19:29 AM
if we are talking about the person that I think that we are, he is acquainted with Oxygen Basic and Charles gets along with him.
#98
Meta Forum / Re: Guess who just applied for...
Last post by Theo Gottwald - April 24, 2024, 07:44:51 AM
Johan got it.
I do not know him, on the other side i do not want to make trouble in the forum. Any arguments why he should join?
#99
Here we are going to ask the same GPT-4 so we can see the result.

Quoteyou are an power basic expert you will deliver ready-to-compile perfectly optimized power basic code this time we will work on formula parser that can calculate the basic mathematics solve brackets and also knows most trigonometric operations split in functions where needed

ChatGPT
QuoteCertainly! We'll build a formula parser in PowerBASIC that handles basic arithmetic operations, solves expressions with nested brackets, and computes common trigonometric functions. The parser will be modular, with separate functions for each type of operation to facilitate readability and maintainability.

Overview of the Parser Design
Tokenization: Split the input string into tokens representing numbers, operators, parentheses, and function names.
Shunting Yard Algorithm: Convert the infix expression (standard notation) to postfix (Reverse Polish Notation, RPN) for easier computation.
Evaluation: Process the RPN expression to calculate the result.
Trigonometric Functions: Include functions for sin, cos, and tan.
We will focus on:

Basic arithmetic: +, -, *, /
Handling parentheses to manage operation precedence.
Trigonometric functions: SIN, COS, TAN (assuming input in radians).
PowerBASIC Code Implementation
First, let's set up the basic structure and tokenization mechanism.


FUNCTION PBMain() AS LONG
    LOCAL expr AS STRING
    expr = "3 + 4 * (2 - 1) + SIN(0.5)"
    PRINT "Result: "; EvaluateExpression(expr)
END FUNCTION

' Function to evaluate the expression
FUNCTION EvaluateExpression(BYVAL expr AS STRING) AS DOUBLE
    LOCAL tokens() AS STRING
    Tokenize(expr, tokens)
    ' Convert to RPN and then evaluate
    LOCAL rpn() AS STRING
    ShuntingYard(tokens, rpn)
    FUNCTION = EvaluateRPN(rpn)
END FUNCTION
Tokenization Function

SUB Tokenize(BYVAL expr AS STRING, tokens() AS STRING)
    LOCAL currentToken AS STRING
    LOCAL ch AS STRING
    FOR i AS LONG = 1 TO LEN(expr)
        ch = MID$(expr, i, 1)
        SELECT CASE ch
            CASE "0" TO "9", "."
                currentToken += ch
            CASE "+", "-", "*", "/", "(", ")"
                IF LEN(currentToken) THEN
                    REDIM PRESERVE tokens(UBOUND(tokens) + 1)
                    tokens(UBOUND(tokens)) = currentToken
                    currentToken = ""
                END IF
                REDIM PRESERVE tokens(UBOUND(tokens) + 1)
                tokens(UBOUND(tokens)) = ch
            CASE ELSE
                IF ch <> " " THEN
                    currentToken += ch
                END IF
        END SELECT
    NEXT
    IF LEN(currentToken) THEN
        REDIM PRESERVE tokens(UBOUND(tokens) + 1)
        tokens(UBOUND(tokens)) = currentToken
    END IF
END SUB


Shunting Yard Algorithm for Handling Operators and Parentheses

SUB ShuntingYard(BYVAL tokens() AS STRING, rpn() AS STRING)
    LOCAL stack AS STRING
    LOCAL token AS STRING
    LOCAL outQueue AS STRING
    ' Implementation of the shunting yard algorithm
    ' [Implementation goes here]
END SUB

RPN Evaluation Function

FUNCTION EvaluateRPN(BYVAL rpn() AS STRING) AS DOUBLE
    LOCAL stack AS DOUBLE
    ' Evaluate the RPN expression
    ' [Implementation goes here]
END FUNCTION

Adding Trigonometric Functions

QuoteThis is the outline for your formula parser. We need to fill in the ShuntingYard and EvaluateRPN functions to complete the parser. If you have specific preferences for handling trigonometric functions or any other specifics, please let me know, and we can adjust the implementation accordingly.

User
Please complete this funtion make it ready to compile:

FUNCTION EvaluateRPN(BYVAL rpn() AS STRING) AS DOUBLE
    LOCAL stack AS DOUBLE
    ' Evaluate the RPN expression
    ' [Implementation goes here]
END FUNCTION


ChatGPT
QuoteTo complete the EvaluateRPN function for evaluating an expression in Reverse Polish Notation (RPN), we will implement a stack-based evaluation approach. Here's how it works:

Traverse the RPN expression token by token.
Push operands (numbers) onto a stack.
When an operator or function token is encountered, pop the required number of operands from the stack, apply the operator or function, and push the result back onto the stack.
Continue until the entire RPN expression has been processed. The value remaining in the stack will be the result of the expression.
Here's a detailed implementation of the EvaluateRPN function, which is ready to compile and integrate with the rest of your PowerBASIC code:

FUNCTION EvaluateRPN(BYVAL rpn() AS STRING) AS DOUBLE
    LOCAL stack(1 TO 256) AS DOUBLE   ' A stack to hold operands
    LOCAL sp AS LONG                  ' Stack pointer
    LOCAL token AS STRING             ' Current token
    LOCAL op1, op2 AS DOUBLE          ' Operands for calculations

    FOR EACH token IN rpn
        SELECT CASE token
            CASE "+", "-", "*", "/"
                IF sp < 2 THEN
                    ? "Error: Insufficient values in the expression"
                    EXIT FUNCTION
                END IF
                op2 = stack(sp): sp = sp - 1
                op1 = stack(sp): sp = sp - 1
                SELECT CASE token
                    CASE "+"
                        stack(sp + 1) = op1 + op2: sp = sp + 1
                    CASE "-"
                        stack(sp + 1) = op1 - op2: sp = sp + 1
                    CASE "*"
                        stack(sp + 1) = op1 * op2: sp = sp + 1
                    CASE "/"
                        IF op2 = 0 THEN
                            ? "Error: Division by zero"
                            EXIT FUNCTION
                        END IF
                        stack(sp + 1) = op1 / op2: sp = sp + 1
                END SELECT
            CASE "SIN", "COS", "TAN"
                IF sp < 1 THEN
                    ? "Error: Insufficient values for the function"
                    EXIT FUNCTION
                END IF
                op1 = stack(sp)
                SELECT CASE token
                    CASE "SIN"
                        stack(sp) = SIN(op1)
                    CASE "COS"
                        stack(sp) = COS(op1)
                    CASE "TAN"
                        stack(sp) = TAN(op1)
                END SELECT
            CASE ELSE
                ' Assume the token is a number and push it onto the stack
                sp = sp + 1
                stack(sp) = VAL(token)
        END SELECT
    NEXT

    IF sp <> 1 THEN
        ? "Error: The RPN expression is invalid."
        EXIT FUNCTION
    END IF

    FUNCTION = stack(1)  ' The result is the only item left on the stack
END FUNCTION

QuoteThis implementation assumes that the RPN array passed to the function is properly formatted and all tokens are valid. The function checks for common errors such as insufficient operands for operators and division by zero. Error handling is minimal and prints error messages to the console.

You can now integrate this function into your formula parser project in PowerBASIC, ensuring that your RPN array generation and tokenization processes align with the requirements of this evaluation function.

User
Please also complete this function, ready to compile:

SUB ShuntingYard(BYVAL tokens() AS STRING, rpn() AS STRING)
    LOCAL stack AS STRING
    LOCAL token AS STRING
    LOCAL outQueue AS STRING
    ' Implementation of the shunting yard algorithm
    ' [Implementation goes here]
END SUB

ChatGPT
To implement the Shunting Yard algorithm, we'll be managing operators, operands, and parentheses to convert an infix expression (standard mathematical notation) into postfix notation (Reverse Polish Notation, RPN). This process will use a stack to hold operators and a queue for the output.

The key steps in the Shunting Yard algorithm include:

Handling operators and applying the correct precedence and associativity.
Managing left and right parentheses to correctly group operations.
Handling function tokens by treating them similarly to parentheses.
Here's a complete and ready-to-compile implementation of the Shunting Yard subroutine for use in PowerBASIC:

SUB ShuntingYard(BYVAL tokens() AS STRING, rpn() AS STRING)
    DIM stack(1 TO 256) AS STRING   ' Stack to hold operators and function tokens
    DIM sp AS LONG                  ' Stack pointer
    DIM output() AS STRING          ' Output queue for RPN tokens
    DIM opCount AS LONG             ' Counter for output array
    LOCAL token AS STRING
    LOCAL topToken AS STRING

    ' Loop through each token in the input array
    FOR EACH token IN tokens
        SELECT CASE token
            CASE "+", "-", "*", "/"
                DO WHILE sp > 0 AND AlsoHigherPrecedence(stack(sp), token)
                    ' Pop from stack to output
                    opCount = opCount + 1
                    REDIM PRESERVE output(opCount)
                    output(opCount) = stack(sp)
                    sp = sp - 1
                LOOP
                ' Push the current operator onto the stack
                sp = sp + 1
                stack(sp) = token
            CASE "("
                ' Push "(" onto stack
                sp = sp + 1
                stack(sp) = token
            CASE ")"
                ' Pop from stack to output until "(" is encountered
                DO WHILE sp > 0 AND stack(sp) <> "("
                    opCount = opCount + 1
                    REDIM PRESERVE output(opCount)
                    output(opCount) = stack(sp)
                    sp = sp - 1
                LOOP
                IF sp = 0 THEN
                    ? "Error: Mismatched parentheses"
                    EXIT SUB
                END IF
                sp = sp - 1  ' Pop the "("
            CASE ELSE
                ' Assume the token is a number or a function name; push directly to output
                opCount = opCount + 1
                REDIM PRESERVE output(opCount)
                output(opCount) = token
        END SELECT
    NEXT

    ' Pop all operators from the stack to the output
    DO WHILE sp > 0
        opCount = opCount + 1
        REDIM PRESERVE output(opCount)
        output(opCount) = stack(sp)
        sp = sp - 1
    LOOP

    ' Copy output to rpn array
    REDIM rpn(1 TO opCount)
    FOR LONG i = 1 TO opCount
        rpn(i) = output(i)
    NEXT
END SUB

' Helper function to determine precedence
FUNCTION AlsoHigherPrecedence(BYVAL stackOp AS STRING, BYVAL incomingOp AS STRING) AS LONG
    FUNCTION = ((stackOp = "*" OR stackOp = "/") AND (incomingOp = "+" OR incomingOp = "-")) OR (stackOp = incomingOp AND (stackOp = "*" OR stackOp = "/"))
END FUNCTION
This subroutine:

Handles basic arithmetic operations with correct precedence rules.
Manages parentheses for grouping expressions.
Directly places numbers (or function results, not handled in this specific implementation but can be added similarly) into the output queue.
Make sure to adjust this example according to the specific rules and operations your parser is supposed to handle, especially if you add more complex functions or operations.

User
After this I ask GPT-4 to give me the complete final code for the parser.
QuoteSure, let's consolidate and provide a complete, ready-to-compile PowerBASIC program that includes all the components discussed earlier for the formula parser. This parser will handle basic arithmetic operations, trigonometric functions, and manage expressions with nested parentheses using the Shunting Yard algorithm to convert infix to postfix notation (RPN), and then evaluate the RPN expression.

Here is the full PowerBASIC code for the formula parser:
' Main function to run the parser
FUNCTION PBMain() AS LONG
    LOCAL expr AS STRING
    expr = "3 + 4 * (2 - 1) + SIN(0.5) - COS(0) / TAN(0.25)"
    PRINT "Result: "; EvaluateExpression(expr)
END FUNCTION

' Evaluate the expression from infix to result
FUNCTION EvaluateExpression(BYVAL expr AS STRING) AS DOUBLE
    LOCAL tokens() AS STRING
    Tokenize(expr, tokens)
    LOCAL rpn() AS STRING
    ShuntingYard(tokens, rpn)
    FUNCTION = EvaluateRPN(rpn)
END FUNCTION

' Tokenizes the input string into manageable components
SUB Tokenize(BYVAL expr AS STRING, tokens() AS STRING)
    LOCAL currentToken AS STRING
    LOCAL ch AS STRING
    FOR i AS LONG = 1 TO LEN(expr)
        ch = MID$(expr, i, 1)
        SELECT CASE ch
            CASE "0" TO "9", "."
                currentToken += ch
            CASE "+", "-", "*", "/", "(", ")"
                IF LEN(currentToken) THEN
                    REDIM PRESERVE tokens(UBOUND(tokens) + 1)
                    tokens(UBOUND(tokens)) = currentToken
                    currentToken = ""
                END IF
                REDIM PRESERVE tokens(UBOUND(tokens) + 1)
                tokens(UBOUND(tokens)) = ch
            CASE ELSE
                IF ch <> " " THEN
                    currentToken += ch
                END IF
        END SELECT
    NEXT
    IF LEN(currentToken) THEN
        REDIM PRESERVE tokens(UBOUND(tokens) + 1)
        tokens(UBOUND(tokens)) = currentToken
    END IF
END SUB

' Converts tokens from infix to postfix using the Shunting Yard algorithm
SUB ShuntingYard(BYVAL tokens() AS STRING, rpn() AS STRING)
    DIM stack(1 TO 256) AS STRING
    DIM sp AS LONG
    DIM output() AS STRING
    DIM opCount AS LONG
    LOCAL token AS STRING

    FOR EACH token IN tokens
        SELECT CASE token
            CASE "+", "-", "*", "/"
                DO WHILE sp > 0 AND AlsoHigherPrecedence(stack(sp), token)
                    opCount = opCount + 1
                    REDIM PRESERVE output(opCount)
                    output(opCount) = stack(sp)
                    sp = sp - 1
                LOOP
                sp = sp + 1
                stack(sp) = token
            CASE "("
                sp = sp + 1
                stack(sp) = token
            CASE ")"
                DO WHILE sp > 0 AND stack(sp) <> "("
                    opCount = opCount + 1
                    REDIM PRESERVE output(opCount)
                    output(opCount) = stack(sp)
                    sp = sp - 1
                LOOP
                IF sp = 0 THEN
                    ? "Error: Mismatched parentheses"
                    EXIT SUB
                END IF
                sp = sp - 1
            CASE ELSE
                opCount = opCount + 1
                REDIM PRESERVE output(opCount)
                output(opCount) = token
        END SELECT
    NEXT

    DO WHILE sp > 0
        opCount = opCount + 1
        REDIM PRESERVE output(opCount)
        output(opCount) = stack(sp)
        sp = sp - 1
    LOOP

    REDIM rpn(1 TO opCount)
    FOR LONG i = 1 TO opCount
        rpn(i) = output(i)
    NEXT
END SUB

' Helper function to determine operator precedence
FUNCTION AlsoHigherPrecedence(BYVAL stackOp AS STRING, BYVAL incomingOp AS STRING) AS LONG
    FUNCTION = ((stackOp = "*" OR stackOp = "/") AND (incomingOp = "+" OR incomingOp = "-")) OR (stackOp = incomingOp AND (stackOp = "*" OR stackOp = "/"))
END FUNCTION

' Evaluates the RPN expression using a stack-based approach
FUNCTION EvaluateRPN(BYVAL rpn() AS STRING) AS DOUBLE
    DIM stack(1 TO 256) AS DOUBLE
    DIM sp AS LONG
    LOCAL token AS STRING
    LOCAL op1, op2 AS DOUBLE

    FOR EACH token IN rpn
        SELECT CASE token
            CASE "+", "-", "*", "/"
                op2 = stack(sp): sp = sp - 1
                op1 = stack(sp): sp = sp - 1
                SELECT CASE token
                    CASE "+"
                        stack(sp + 1) = op1 + op2: sp = sp + 1
                    CASE "-"
                        stack(sp + 1) = op1 - op2: sp = sp + 1
                    CASE "*"
                        stack(sp + 1) = op1 * op2: sp = sp + 1
                    CASE "/"
                        IF op2 = 0 THEN
                            ? "Error: Division by zero"
                            EXIT FUNCTION
                        END IF
                        stack(sp + 1) = op1 / op2: sp = sp + 1
                END SELECT
            CASE "SIN", "COS", "TAN"
                op1 = stack(sp)
                SELECT CASE token
                    CASE "SIN"
                        stack(sp) = SIN(op1)
                    CASE "COS"
                        stack(sp) = COS(op1)
                    CASE "TAN"
                        stack(sp) = TAN(op1)
                END SELECT
            CASE ELSE
                sp = sp + 1
                stack(sp) = VAL(token)
        END SELECT
    NEXT

    IF sp <> 1 THEN
        ? "Error: The RPN expression is invalid."
        EXIT FUNCTION
    END IF

    FUNCTION = stack(1)
END FUNCTION

QuoteThis program is complete and ready to compile in a PowerBASIC environment. It includes all necessary components to parse and evaluate expressions involving basic arithmetic and trigonometric functions, handling nested parentheses properly. Ensure your development environment is set up correctly to compile and run PowerBASIC programs. If you encounter any issues or need further adjustments, feel free to ask!
#100
🤔 Did you know you can use AI without sharing your data with unknown entities? With Gpt-4all, you can run AI locally on your computer!

And what can this AI do?
Let me give you an example. I asked the AI to create a formula solver for basic arithmetic operations and parentheses. The result might not be perfect, but with a few tweaks, it can work wonders. 💡👨�💻🤯 #AI #tptforall #innovation




powerbasic
DECLARE FUNCTION Main()

FUNCTION Main()
    LOCAL szExpression AS STRING * 1024, fResult AS SINGLE
    LOCAL iPos AS LONG

    ' Get the expression from user input (or a file, etc.)
    szExpression = "2 + ((3 - 1) * 4)"

    ' Parse and evaluate the expression
    fResult = EvaluateFormula(szExpression)

    ' Print the result
    PRINT "Result: "; STR$(fResult)

END FUNCTION

FUNCTION EvaluateFormula(szExpression AS STRING) AS SINGLE
    LOCAL iPos AS LONG, cToken AS CHAR
    LOCAL fValue1 AS SINGLE, fValue2 AS SINGLE
    LOCAL sOperator AS STRING * 10
    LOCAL bInParentheses AS BOOLEAN = FALSE

    ' Initialize the result to zero (or any default value)
    Local fResult = 0.0

    ' Tokenize the expression into individual tokens (operators and numbers)
    iPos = 1
    WHILE iPos <= LEN(szExpression)
        cToken = MID$(szExpression, iPos, 1)

        IF ISDIGIT(cToken) THEN
            ' Found a number - extract it as a floating-point value
            fValue1 = VAL(MID$(szExpression, iPos))
            iPos += LEN(STR$(fValue1)) + 1

        ELSEIF cToken = "(" THEN
            ' Found an opening parenthesis - enter parentheses mode
            bInParentheses = TRUE

        ELSEIF cToken = ")" THEN
            ' Found a closing parenthesis - exit parentheses mode and evaluate the expression inside
            IF NOT bInParentheses THEN
                PRINT "Error: Unbalanced parentheses"
                EXIT FUNCTION
            ENDIF

            fValue1 = EvaluateExpressionInsideParentheses(szExpression, iPos)
            iPos += 2

        ELSEIF ISOPERATOR(cToken) THEN
            ' Found an operator - perform the operation and update the result (if not in parentheses mode)
            IF NOT bInParentheses THEN
                SELECT CASE cToken
                    CASE "+"
                        fResult += fValue1
                    CASE "-"
                        fResult -= fValue1
                    CASE "*"
                        fResult *= fValue1
                    CASE "/"
                        IF fValue1 <> 0.0 THEN
                            fResult /= fValue1
                        ELSE
                            PRINT "Error: Division by zero!"
                            EXIT FUNCTION
                        ENDIF
                ENDSELECT

            ENDIF

        ENDIF

    WEND

    ' Return the final result
    EvaluateFormula = fResult

END FUNCTION

FUNCTION EvaluateExpressionInsideParentheses(szExpression AS STRING, iPos AS LONG) AS SINGLE
    LOCAL cToken AS CHAR
    LOCAL fValue1 AS SINGLE, fValue2 AS SINGLE
    LOCAL sOperator AS STRING * 10
    LOCAL bInParentheses AS BOOLEAN = FALSE

    ' Initialize the result to zero (or any default value)
    Local fResult = 0.0

    ' Tokenize the expression inside parentheses into individual tokens (operators and numbers)
    iPos += 1
    WHILE iPos <= LEN(szExpression) - 1
        cToken = MID$(szExpression, iPos, 1)

        IF ISDIGIT(cToken) THEN
            ' Found a number - extract it as a floating-point value
            fValue1 = VAL(MID$(szExpression, iPos))
            iPos += LEN(STR$(fValue1)) + 1

        ELSEIF cToken = "(" THEN
            ' Found an opening parenthesis - enter parentheses mode
            bInParentheses = TRUE

        ELSEIF cToken = ")" THEN
            ' Found a closing parenthesis - exit parentheses mode and return the evaluated expression inside
            IF NOT bInParentheses THEN
                PRINT "Error: Unbalanced parentheses"
                EXIT FUNCTION
            ENDIF

            EvaluateExpressionInsideParentheses = fResult
            RETURN

        ELSEIF ISOPERATOR(cToken) THEN
            ' Found an operator - perform the operation and update the result (if not in parentheses mode)
            IF NOT bInParentheses THEN
                sOperator = cToken
                iPos += 1

                WHILE iPos <= LEN(szExpression) - 1 AND MID$(szExpression, iPos, 1) <> ")"
                    cToken = MID$(szExpression, iPos, 1)

                    IF ISDIGIT(cToken) THEN
                        ' Found a number - extract it as a floating-point value and perform the operation
                        fValue2 = VAL(MID$(szExpression, iPos))
                        SELECT CASE sOperator
                            CASE "+"
                                fResult += fValue2
                            CASE "-"
                                fResult -= fValue2
                            CASE "*"
                                fResult *= fValue2
                            CASE "/"
                                IF fValue2 <> 0.0 THEN
                                    fResult /= fValue2
                                ELSE
                                    PRINT "Error: Division by zero!"
                                    EXIT FUNCTION
                                ENDIF
                        ENDSELECT

                    ENDIF

                WEND

            ENDIF

        ENDIF

    WEND

    ' Return the final result (if not in parentheses mode)
    EvaluateExpressionInsideParentheses = fResult

END FUNCTION

FUNCTION ISOPERATOR(cToken AS CHAR) AS BOOLEAN
    SELECT CASE cToken
        CASE "+", "-", "*", "/"
            ISOPERATOR = TRUE
        ELSE
            ISOPERATOR = FALSE
    ENDSELECT

END FUNCTION

' Test the formula evaluation function
SUB Main()
    LOCAL szFormula AS STRING * 100, fResult AS SINGLE

    ' Define a test formula: (2 + 3) * 4 - 1
    szFormula = "(2+3)*4-1"

    ' Evaluate the formula and print the result
    fResult = EvaluateFormula(szFormula)
    PRINT "The result is: "; fResult

END SUB

This code defines a function `EvaluateFormula` that takes a string representing a mathematical expression as input, evaluates it using recursive descent parsing, and returns the result. The function uses two helper functions: `ISDIGIT` to check if a character is a digit, and `ISOPERATOR` to check if a character is an operator (+, -, *, /).

The code also includes a test subroutine `Main()` that defines a sample formula `(2 + 3) * 4 - 1`, evaluates it using the `EvaluateFormula` function, and prints the result.

Note that this implementation has some limitations:

* It does not support parentheses nesting beyond two levels.
* It assumes that the input expression is well-formed (i.e., there are no syntax errors).
* It uses a simple recursive descent parsing approach, which may not be efficient for very complex expressions.

You can modify or extend this code to improve its performance and functionality. For example, you could add support for more advanced mathematical operations, such as exponentiation (`^`), trigonometric functions (e.g., `sin`, `cos`, `tan`), or logarithmic functions (e.g., `log`). You could also implement error handling to detect and report syntax errors in the input expression

Now we ask Llama to enhance the Parser to also solve () and some geometry.

Quote��Here's an updated version of the code that adds support for exponentiation (`^`), trigonometric functions (e.g., `sin`, `cos`, `tan`), logarithmic functions (e.g., `log`), and error handling:

' Define a function to evaluate mathematical expressions using recursive descent parsing

FUNCTION EvaluateFormula(szExpression AS STRING) AS SINGLE
    LOCAL cToken AS CHAR, iPos AS LONG, fValue1 AS SINGLE, fValue2 AS SINGLE
    LOCAL sOperator AS STRING * 10, bInParentheses AS BOOLEAN = FALSE

    ' Initialize the result to zero (or any default value)
    Local fResult = 0.0

    ' Tokenize the expression into individual tokens (operators and numbers)
    iPos = 1
    WHILE iPos <= LEN(szExpression) - 1
        cToken = MID$(szExpression, iPos, 1)

        IF ISDIGIT(cToken) THEN
            ' Found a number - extract it as a floating-point value
            fValue1 = VAL(MID$(szExpression, iPos))
            iPos += LEN(STR$(fValue1)) + 1

        ELSEIF cToken = "(" THEN
            ' Found an opening parenthesis - enter parentheses mode
            bInParentheses = TRUE

        ELSEIF cToken = ")" THEN
            ' Found a closing parenthesis - exit parentheses mode and evaluate the expression inside (if not in error)
            IF NOT bInParentheses THEN
                PRINT "Error: Unbalanced parentheses"
                EXIT FUNCTION
            ENDIF

            fValue1 = EvaluateExpressionInsideParentheses(szExpression, iPos + 1)
            iPos += 2

        ELSEIF ISOPERATOR(cToken) THEN
            ' Found an operator - perform the operation and update the result (if not in error or parentheses mode)
            IF NOT bInParentheses THEN
                SELECT CASE cToken
                    CASE "+"
                        fResult = fValue1 + EvaluateExpressionInsideParentheses(szExpression, iPos + 1)
                    CASE "-"
                        fResult = fValue1 - EvaluateExpressionInsideParentheses(szExpression, iPos + 1)
                    CASE "*"
                        fResult *= EvaluateExpressionInsideParentheses(szExpression, iPos + 1)
                    CASE "/"
                        IF EvaluateExpressionInsideParentheses(szExpression, iPos + 1) <> 0.0 THEN
                            fResult /= EvaluateExpressionInsideParentheses(szExpression, iPos + 1)
                        ELSE
                            PRINT "Error: Division by zero!"
                            EXIT FUNCTION
                        ENDIF
                    CASE "^"
                        fResult = POWER(fValue1, EvaluateExpressionInsideParentheses(szExpression, iPos + 1))
                ENDSELECT

            ENDIF

        ELSEIF cToken = "SIN" THEN
            ' Found the SIN function - evaluate it and update the result (if not in error or parentheses mode)
            IF NOT bInParentheses THEN
                fResult = SIN(EvaluateExpressionInsideParentheses(szExpression, iPos + 3))
            ENDIF

        ELSEIF cToken = "COS" THEN
            ' Found the COS function - evaluate it and update the result (if not in error or parentheses mode)
            IF NOT bInParentheses THEN
                fResult = COS(EvaluateExpressionInsideParentheses(szExpression, iPos + 3))
            ENDIF

        ELSEIF cToken = "TAN" THEN
            ' Found the TAN function - evaluate it and update the result (if not in error or parentheses mode)
            IF NOT bInParentheses THEN
                fResult = TAN(EvaluateExpressionInsideParentheses(szExpression, iPos + 3))
            ENDIF

        ELSEIF cToken = "ABS" THEN
            ' Found the ABS function - evaluate it and update the result (if not in error or parentheses mode)
            IF NOT bInParentheses THEN
                fResult = ABS(EvaluateExpressionInsideParentheses(szExpression, iPos + 3))
            ENDIF

        ELSEIF cToken = "SQRT" THEN
            ' Found the SQRT function - evaluate it and update the result (if not in error or parentheses mode)
            IF NOT bInParentheses THEN
                fResult = SQR(EvaluateExpressionInsideParentheses(szExpression, iPos + 4))
            ENDIF

        ELSE
            PRINT "Error: Unknown token '" & cToken & "'"
            EXIT FUNCTION
    ENDSELECT

ENDFUNCTION

' Helper function to evaluate an expression inside parentheses (if not in error)
FUNCTION EvaluateExpressionInsideParentheses(szExpression As String, iStartPos As Integer) As Double
    Dim fValue1 As Double
    Dim bInParentheses As Boolean: bInParentheses = FALSE
    Dim cToken As Char

    FOR iPos = iStartPos TO LEN(szExpression)

        cToken = MID$(szExpression, iPos)
        SELECT CASE cToken
            CASE ")", ","
                EXIT FOR ' Exit the loop when we find a closing parenthesis or comma (end of expression inside parentheses)
            CASE ELSEIF ISOPERATOR(cToken) THEN
                PRINT "Error: Unbalanced parentheses!"
                EXIT FUNCTION

            CASE ELSE
                IF bInParentheses THEN
                    fValue1 = VAL(MID$(szExpression, iPos))
                    EXIT FOR ' Exit the loop when we find a value (end of expression inside parentheses)
                ENDIF

        ENDSELECT

    NEXT iPos

    EvaluateExpressionInsideParentheses = fValue1
ENDFUNCTION

' Helper function to check if a character is an operator (+, -, *, /, ^)
FUNCTION ISOPERATOR(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-", "*", "/", "^"
            ISOPERATOR = TRUE
        CASE ELSE
            ISOPERATOR = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is a digit (0-9)
FUNCTION ISDIGIT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "0" TO "9"
            ISDIGIT = TRUE
        CASE ELSE
            ISDIGIT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an alphabet letter (a-z or A-Z)
FUNCTION ISALPHABET(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "A" TO "Z", "a" TO "z"
            ISALPHABET = TRUE
        CASE ELSE
            ISALPHABET = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is whitespace (space, tab, etc.)
FUNCTION ISWHITESPACE(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE " ", TAB, VBCRLF ' Check for space and other whitespace characters
            ISWHITESPACE = TRUE
        CASE ELSE
            ISWHITESPACE = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an opening or closing parenthesis ( )
FUNCTION ISPARENTHESIS(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "(", ")"
            ISPARENTHESIS = TRUE
        CASE ELSE
            ISPARENTHESIS = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an identifier or keyword (variable name, SIN, COS, TAN, ABS, SQRT)
FUNCTION ISIDENTIFIER(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "SIN", "COS", "TAN", "ABS", "SQRT"
            ISIDENTIFIER = TRUE
        CASE ELSEIF ISALPHABET(cToken) THEN ' Check for variable name or identifier (starts with a letter)
            ISIDENTIFIER = TRUE
        CASE ELSE
            ISIDENTIFIER = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an operator (+, -, *, /, ^)
FUNCTION ISOPERATOR(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-", "*", "/", "^"
            ISOPERATOR = TRUE
        CASE ELSE
            ISOPERATOR = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is whitespace (space, tab, etc.)
FUNCTION ISWHITESPACE(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE " ", TAB, VBCRLF ' Check for space and other whitespace characters
            ISWHITESPACE = TRUE
        CASE ELSE
            ISWHITESPACE = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an opening or closing parenthesis ( )
FUNCTION ISPARENTHESIS(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "(", ")"
            ISPARENTHESIS = TRUE
        CASE ELSE
            ISPARENTHESIS = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an identifier or keyword (variable name, SIN, COS, TAN, ABS, SQRT)
FUNCTION ISIDENTIFIER(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "SIN", "COS", "TAN", "ABS", "SQRT"
            ISIDENTIFIER = TRUE
        CAS


Here the code generation stops, and we let it continue by writing "Continue".


CASE ELSEIF ISALPHABET(cToken) THEN ' Check for variable name or identifier (starts with a letter)
    ISIDENTIFIER = TRUE
CASE ELSE
    ISIDENTIFIER = FALSE
ENDSELECT
ENDFUNCTION

' Helper function to check if two characters are equal
FUNCTION ARECHARACTERSEQUAL(cChar1 As Char, cChar2 As Char) As Boolean
    SELECT CASE cChar1, cChar2
        CASE " ", " "
            ARECHARACTERSEQUAL = TRUE
        CASE ELSE
            ARECHARACTERSEQUAL = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an operator (+, -, *, /, ^)
FUNCTION ISOPERATOR(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-", "*", "/", "^"
            ISOPERATOR = TRUE
        CASE ELSE
            ISOPERATOR = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is whitespace (space, tab, etc.)
FUNCTION ISWHITESPACE(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE " ", TAB, VBCRLF ' Check for space and other whitespace characters
            ISWHITESPACE = TRUE
        CASE ELSE
            ISWHITESPACE = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an alphabet letter (a-z or A-Z)
FUNCTION ISALPHABET(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "A" TO "Z", "a" TO "z"
            ISALPHABET = TRUE
        CASE ELSE
            ISALPHABET = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an integer digit (0-9)
FUNCTION ISDIGIT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "0" TO "9"
            ISDIGIT = TRUE
        CASE ELSE
            ISDIGIT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an exponent (e or E)
FUNCTION ISEXPO(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "E", "e"
            ISEXPO = TRUE
        CASE ELSE
            ISEXPO = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an exponent sign (+ or -)
FUNCTION ISEXPONENTSIGN(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-"
            ISEXPONENTSIGN = TRUE
        CASE ELSE
            ISEXPONENTSIGN = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an imaginary unit (i or I)
FUNCTION ISIUNIT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "I", "i"
            ISIUNIT = TRUE
        CASE ELSE
            ISIUNIT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an imaginary unit sign (+ or -)
FUNCTION ISIMAGINARYSIGN(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-"
            ISIMAGINARYSIGN = TRUE
        CASE ELSE
            ISIMAGINARYSIGN = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an operator (function or procedure name)
FUNCTION ISOBJECT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "SIN", "COS", "TAN", "ABS", "SQRT"
            ISOBJECT = TRUE
        CASE ELSEIF ISALPHABET(cToken) THEN ' Check for variable name or identifier (starts with a letter)
            ISOBJECT = TRUE
        CASE ELSE
            ISOBJECT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if two characters are equal
FUNCTION ARECHARACTERSEQUAL(cChar1 As Char, cChar2 As Char) As Boolean
    SELECT CASE cChar1, cChar2
        CASE " ", " "
            ARECHARACTERSEQUAL = TRUE
        CASE ELSE
            ARECHARACTERSEQUAL = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an operator (+, -, *, /, ^)
FUNCTION ISOPERATOR(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-", "*", "/", "^"
            ISOPERATOR = TRUE
        CASE ELSE
            ISOPERATOR = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is whitespace (space, tab, etc.)
FUNCTION ISWHITESPACE(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE " ", TAB, VBCRLF ' Check for space and other whitespace characters
            ISWHITESPACE = TRUE
        CASE ELSE
            ISWHITESPACE = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an alphabet letter (a-z or A-Z)
FUNCTION ISALPHABET(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "A" TO "Z", "a" TO "z"
            ISALPHABET = TRUE
        CASE ELSE
            ISALPHABET = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an integer digit (0-9)
FUNCTION ISDIGIT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "0" TO "9"
            ISDIGIT = TRUE
        CASE ELSE
            ISDIGIT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an exponent (e or E)
FUNCTION ISEXPO(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "E", "e"
            ISEXPO = TRUE
        CASE ELSE
            ISEXPO = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an exponent sign (+ or -)
FUNCTION ISEXPONENTSIGN(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-"
            ISEXPONENTSIGN = TRUE
        CASE ELSE
            ISEXPONENTSIGN = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an imaginary unit (i or I)
FUNCTION ISIUNIT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "I", "i"
            ISIUNIT = TRUE
        CASE ELSE
            ISIUNIT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an imaginary unit sign (+ or -)
FUNCTION ISIMAGINARYSIGN(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "+", "-"
            ISIMAGINARYSIGN = TRUE
        CASE ELSE
            ISIMAGINARYSIGN = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if a character is an operator (function or procedure name)
FUNCTION ISOBJECT(cToken As Char) As Boolean
    SELECT CASE cToken
        CASE "SIN", "COS", "TAN", "ABS", "SQRT"
            ISOBJECT = TRUE
        CASE ELSEIF ISALPHABET(cToken) THEN ' Check for variable name or identifier (starts with a letter)
            ISOBJECT = TRUE
        CASE ELSE
            ISOBJECT = FALSE
    ENDSELECT
ENDFUNCTION

' Helper function to check if two characters are equal
FUNCTION ARECHARACTERSEQUAL(cChar1 As Char, cChar2 As Char) As Boolean
    SELECT CASE cChar1, cChar2
        CASE " ", " "
            ARECHARC


Again he stops and now he completely run out of his context window and does not know what to do. From now he would just repeat what he did before.



#AI #coding

🌟 As a result, we can say that the local AI is very powerful 🚀 and can be utilized to get a general overview of coding projects. 📊

However, it is not capable of generating extensive code, especially not in PowerBasic. 🛑

#AI #coding #tech #innovation 🤖💻

---