Continue to Site

Welcome to EDAboard.com

Welcome to our site! EDAboard.com is an international Electronics Discussion Forum focused on EDA software, circuits, schematics, books, theory, papers, asic, pld, 8051, DSP, Network, RF, Analog Design, PCB, Service Manuals... and a whole lot more! To participate you need to register. Registration is free. Click here to register now.

[SOLVED] pic18f452 code build problem

Status
Not open for further replies.

jagdeepsingh3@hotmail.it

Member level 3
Joined
Sep 2, 2012
Messages
54
Helped
1
Reputation
2
Reaction score
2
Trophy points
1,288
Activity points
1,634
hii all i want to build this code but with mplab ide it is giving me many errors can anyone help me ??

what program i have to use to build this file??

Code:
'****************************************************************
'*  Name    :                                     *
'*  Author  :                                      *
'*  Notice  :         *
'*          :                                *
'*  Date    :                                         *
'*  Version :                                               *
'*  Notes   : Uses a PIC18F452. Outputs MOSFET DRIVE THROUGH    *                
'*          ' HWPM + CD4081 FOR CHANNEL CONTROL.                *
'*          ' LOOKUP TABLE FOR SINE                             *
'*          ' INTERRUPT FOR 1)CURRENT LIMIT,2)MOS-DRIVE,3) UPS MODE
'*          :                                                   *
'****************************************************************
                                  '
    DEFINE OSC 40                 'USES A 10MHz CRYSTAL IN x4 PLL MODE FOR 40MHz CLOCK
    DEFINE USE_LFSR 1             'Makes some code shorter
'*******************************************************************************
' Define interrupt handler        '
    DEFINE INTHAND myint          '
                                  '
'********* LCD PORT DEFINITIONS ************************************************

    DEFINE LCD_DREG PORTD         ' Set LCD Data port PORTD
    DEFINE LCD_DBIT 0             ' Set starting Data bit (0 or 4) if 4-bit bus i.e, PortD.0-PORTD.3
    DEFINE LCD_RSREG PORTC        ' Set LCD Register Select PORTC
    DEFINE LCD_RSBIT 5            ' Set LCD Register Select bit i.e, PORTC.5
    DEFINE LCD_EREG PORTC         ' Set LCD Enable port
    DEFINE LCD_EBIT 4             ' Set LCD Enable bit i.e, PORTC.4
    DEFINE LCD_BITS 4             ' Set LCD bus size to 8 bits
    DEFINE LCD_LINES 2            ' Set number of lines on LCD to 4 Lines
    DEFINE LCD_COMMANDUS 2000     ' Set command delay time in us
    DEFINE LCD_DATAUS 50          ' Set data delay time in us
    
'Variables for saving state in interrupt handler *******************************
wsave           VAR BYTE bankA system   ' Saves W
ssave           VAR BYTE bankA system   ' Saves STATUS
fsave           VAR WORD bankA system   ' Saves FSR0
'///////////////////////////////////////////////////////////////////////////////
DEAD            VAR BIT  bankA system   ' SET FOR DEAD TIME SETTING CLEARED EVERY ZERO-CROSS
TIM0INT         VAR BIT  bankA system   ' TIMER0 INTERRUPT CLEARED WHEN IT OCCURS
SYNCOK          VAR BIT  bankA system   ' SET WHEN SYNCHRONIZED TO MAIN
AC              VAR BIT  bankA system   ' SET WHEN AC IS AVAILABLE
PHASE           VAR BIT  bankA system   ' DRIVE PHASE (DETERMINE WHICH CYCLE)
OVERCURRENT     VAR BIT  bankA system   ' SET WHEN AN OVERLOAD INTERRUPT OCCURS
ADCINT          VAR BIT  bankA system   ' SET WHEN AD CONVERSION HAS FINISHED (RESET AT INT)
INTVAL          VAR WORD bankA system   ' PWM UPDATE INTERRUPT (ADJUSTED TO LOCK TO AC)
INDEX           VAR BYTE bankA system   ' SINE-TABLE INDEX POINTER
PWMVAL          VAR BYTE bankA system   ' PWMVALUE FOR FIRING
TEMP            VAR WORD                ' TEMPORARY VARIABLE

    MOS1        VAR PORTC.0             ' MOSFET CHANNEL-1 GATE DRIVE
    MOS2        VAR PORTC.1             ' MOSFET CHANNEL-2 GATE DRIVE
    PULSE       VAR PORTC.2             ' MODULATING PWM OUTPUT (32KHz, SINE-TABLED)
    LCDLAMP     VAR PORTC.3             ' CONTROLS THE LCD BACKLIGHT - 0=ON,1=OFF
    RELAY       VAR PORTD.4             ' TRANSFER RELAY + INDICATION
    BUZZER      VAR PORTD.5             ' AUDIO ANNUNCIATION
    FAULT       VAR PORTD.6             ' FAULT INDICATION
    LOCKED      VAR PORTD.7             ' SYNC-LOCK TO AC INDICATION
    
    OVERLOAD    VAR PORTB.0             ' MOSFET OVERLAOD INPUT / IMMEDIATE SHUTDOWN
    FAIL        VAR PORTB.1             ' AC-FAIL INPUT (FROM16F676)
    SYNC        VAR PORTB.2             ' AC-MAINS SYNC INPUT
    STANDBY     VAR PORTB.3             ' STANDBY/OFF SWITCH (INVERTER-MODE)
    TRICKLE     VAR PORTB.4             ' SWITCHES-OFF THE BATTERY CHARGER
    MENU        VAR PORTB.5             ' MENU-BUTTON
    INCR        VAR PORTB.6             ' INCREASE-BUTTON
    DECR        VAR PORTB.7             ' DECREASE-BUTTON
    
    TP1         VAR PORTE.0             ' TEST POINT 1 FOR OSCILLOSCOPE CHECK
    TP2         VAR PORTE.1             ' TEST POINT 2 FOR OSCILLOSCOPE CHECK
    HEARTBEAT   VAR PORTE.2             ' HEART-BEAT LED
      
'******PORT DATA DIRECTIONS ****************************************************
    LATC     = 0                        ' CLEAR THE PORTC DATA LATCHES
    TRISC    = %10000000                ' SET PORTC DIRECTIONS
    PORTC    = 0                        ' MAKE-SURE THAT THE MOSFETS ARE TURNED-OFF
    TRISA    = %00111111
    
    
    TRISD    = %00000000                ' PORTD DATA DIRECTIONS (ALL OUTPUTS)
    PORTD    = 0                        ' TURN-ON BACKLIGHT AND OTHERS OFF
    TRISB    = %11101111                ' SET PORTB DIRECTIONS
    PORTB.4  = 0                        ' TURN-OFF CHARGER
    TRISE    = %00000000                ' PORTE DATA DIRECTIONS (ALL-OUTPUTS)
    PORTB    = 0                        ' TURN-OFF HEARTBEAT AND TEST POINTS
    ADCON0   = %10000000                ' RIGHT JUSTIFY,FOSC/64
    ADCON1   = %11000010                ' FOSC/64, PORTE DIGITAL

'*******************************************************************************

GOTO STARTUP ' SKIP AROUND THE INTERRUPT HANDLER    
    
' ***Assembly language INTERRUPT handler****************************************
Asm
myint

; Save the state of critical registers
        movwf   wsave              ; Save W
        swapf   STATUS, W          ; Swap STATUS to W (swap avoids changing STATUS)
        clrf    STATUS             ; Clear STATUS
        movwf   ssave              ; Save swapped STATUS

; Save the FSR value because it gets changed below  
        movf    Low FSR0, W        ; Move FSR0 lowbyte to W
        movwf   fsave              ; Save FSR0 lowbyte
        movf    High FSR0, W       ; Move FSR0 highbyte to W
        movwf   fsave+1            ; Save FSR0 highbyte
; CHECK IF OVERLOAD OCCURED i,e., PORTB.0 INTERUPTED (FIRST PRIORITY)
        btfss   INTCON, INT0IF     ; CHECK IF OVERLOAD OCCURED
        GoTo    CHECKAC
; TURN-OFF THE GATE DRIVES (PORTC.0&PORTC.1) RETAINING OTHER BITS (PULSE BY PULSE LIMIT)
        MOVLW   0xFC               ; MOVE '11111100
        ANDWF   PORTC,1            ; ADD W WITH PORTC AND PLACE IN PORTC
        bcf     INTCON, INT0IF     ; CLEAR THE HARDWARE INTERRUPT FLAG PORTB.0
        bsf     OVERCURRENT        ; SET THE SOFTWARE OVERLOAD FLAG
; CHECK IF THE AC-FAILED i,e., IF PORTB.1 INTERRUPTED  
CHECKAC
        btfss   INTCON3, INT1IF    ; CHECK IF AC-FAILED OCCURED
        GoTo    AC_SYNC            ; IF AC DID NOT FAILED THEN SKIP AND CHECK FOR TIMER0
        bsf     PORTD, 4           ; TURN-ON THE TRANSFER RELAY
        bcf     INTCON3, INT1IF    ; CLEAR THE AC-FAIL INTERRUPT FLAG
        bcf     AC                 ; CLEAR THE AC FLAG
        bcf     SYNCOK             ; CLEAR THE SYNCHRONIZED FLAG        
        bcf     INTCON3, INT1IE    ; DISABLE FURTHER AC-CHECK INTERRUPTS
        bcf     INTCON3, INT2IE    ; DISABLE FURTHER SYNC INTERRUPT

; SYNCHRONIZE THE AC-FREE RUNNING TIMER
AC_SYNC        
        btfss   INTCON3, INT2IF    ; CHECK IF AC-FAILED OCCURED
        GoTo    TIMEKEEP           ; IF AC-SYNC DID NOT OCCUR THEN SKIP AND CHECK FOR TIMER0
        bcf     INTCON3, INT2IF    ; CLEAR THE INT2 HARDWARE FLAG
        MOVLW   0x0                ; MOVE ZERO TO THE WORKING REGISTER
        MOVWF   TMR1H              ; RESET TMR1H
        MOVWF   TMR1L              ; RESET TMR1L
; CHECK FOR TIMER0 INTERRUPT EVERY 312.5uS      
TIMEKEEP

        btfss   INTCON, TMR0IF     ; TEST IF T0 OVERFLOWED
        GoTo    FINISHED           ; SKIP IF SET
        BTG     PORTC, 3           ; TOGGLE THE LCDLAMP FOR SCOPE CHECK
        MOVLW   0xFC               ; MOVE '11111100
        ANDWF   PORTC,1            ; ADD W WITH PORTC AND PLACE IN PORTC
        movff   INTVAL+1,TMR0H     ; MOVE THE HIGH VALUE TO W REG 
        movff   INTVAL,  TMR0L     ; MOVE THE LOW VALUE TO W REG 
        bcf     TIM0INT            ; CLEAR THE TIM0INT SOFTWARE FLAG
        bcf     INTCON, TMR0IF     ; CLEAR THE TIMER0 INT HARDWARE FLAG
        bcf     ADCINT             ; CLEAR THE ADC INTERRUPT FLAG
        incf    INDEX, 1           ; INCREMENT INDEX
        movf    INDEX, W           ;
        sublw   .32                ; Substract INDEX FROM 32
        btfss   STATUS,Z
        GoTo    FINISHED           ; SKIP PHASE CHANGE (INDEX RESET)
        clrf    INDEX              ; CLEAR THE INDEX
        btg     PHASE              ; TOGGLE THE PHASE
; Restore FSR, PCLATH, STATUS and W registers
FINISHED 
        movf    fsave, W           ; retrieve FSR0 lowbyte value
        movwf   Low FSR0           ; Restore it to FSR0 lowbyte
        movf    fsave+1, W         ; retrieve FSR0 highbyte value
        movwf   High FSR0          ; Restore it to FSR0 highbyte
        swapf   ssave, W           ; Retrieve the swapped STATUS value (swap to avoid changing STATUS)
        movwf   STATUS             ; Restore it to STATUS
        swapf   wsave,  F          ; Swap the stored W value
        swapf   wsave,  W          ; Restore it to W (swap to avoid changing STATUS)
        retfie                     ; Return from the interrupt
EndAsm
'///////////////////////////////////////////////////////////////////////////////    

'///////////////////////////////////////////////////////////////////////////////

    
STARTUP:
LCDOUT $FE, 1 :PAUSE 100          ' CLEAR AND INITIALIZE THE LCD
LCDOUT "ANDIG INVERTER"           ' DISPLAY MESSAGE


'***PWM SETUP //////////////////////////////////////////////////////////////////    
    PR2     = $FF          ' SET THE PWM PERIOD TO 255}
    T2CON   = %00000100    ' PRESCALE=1, TIMER2 0N    } YIELDS A 39KHz PWM
    CCPR1L  = 0            ' SET THE DUTY CYCLE INITIALLY TO 0
    CCP1CON = %00001100    ' CONFIGURE AND START AS PWM
'***END OF PWM SETUP ///////////////////////////////////////////////////////////

'* TIMER ZERO SETUP/////////////////////////////////////////////////////////////
T0CON  = %00001000         ' NO-PRESCALE , 16BIT, OFF AT THIS MOMENT
TMR0H = $FF                ' LOAD THE HIGH BYTE
TMR0L = $CA                ' LOAD THE LOW BYTE
'* END OF TIMER ZERO SETUP//////////////////////////////////////////////////////

'** SET UP THE INTERRUPTS///////////////////////////////////////////////////////
INTCON  = %00110000 ' TMR0 = 1, INT0 = 1 , PIE = 0, GIE=0 AT THIS MOMENT,
INTCON2 = %00000000 ' PULLUP = 1,OVERLOAD=AC-FAIL=SYNC=FALLING EDGE
INTCON3 = %00000000 '%00011000 ' INT1=INT2=1, LOW PRIORITY (NOW NOT ENABLED)
'** END OF SET UP OF THE INTERRUPTS/////////////////////////////////////////////

'** SET UP TIMER1 FOR AC-SYCN COUNTING (FREE-RUNNING) 
                     ' THIS VALUE IS ADJUSTED ONLY DURING SYNCHRONIZE PHASE
INTCON.7 = 1         ' ENABLE GLOBAL INTERRUPT
T0CON.7  = 1         ' START TIMER 0


FIRE:
TEMP = TMR0L                    ' NEEDED FOR THE SIMULATOR TO UPDATE TMR0H 
IF TIM0INT = 0 THEN             ' IF A FRESH FIRING IS NEEDED THEN
   TIM0INT = 1                  ' SET THE SOFTWARE INT FIRING FLAG
    
    LOOKUP INDEX, [0,25,50,74,98,120,142,162,180,197,212,_ ' GET THE PWMVALUE
    225,235,244,250,254,255,254,250,244,235,_
    225,212,197,180,162,142,120,98,74,50,25],PWMVAL
    
    CCPR1L = PWMVAL             ' LOAD THE PWMVAL TO THE HWPWM
         IF PHASE = 0 THEN      ' FIRE THE MOSFETS ACCORDING TO THE PHASE VALUE
             MOS1 = TIM0INT     ' FIRE USING SAFETY LOGIC
             ELSE               ' EITHER CHANNEL 1 OR CHANNEL 2 (DEPENDS ON PHASE)
             MOS2 = TIM0INT     ' FIRING USING SAFETY LOGIC
         ENDIF

ENDIF
GOTO FIRE
 

What Compiler/Assembler are you using? I see both asm and basic code in it. Post the link from where you got that code. Post the error messages you are getting.
 

Code:
Debug build of project `C:\Users\jagdeep\pic18f452\jj.mcp' started.
Language tool versions: MPASMWIN.exe v5.44, mplink.exe v9.80, mcc18.exe v9.80, mplib.exe v9.80
Preprocessor symbol `__DEBUG' is defined.
Wed Apr 10 17:57:19 2013
----------------------------------------------------------------------
Make: The target "C:\Users\jagdeep\pic18f452\defu.o" is out of date.
Executing: "C:\Program Files\Microchip\MPASM Suite\MPASMWIN.exe" /q /p18F452 "defu.asm" /l"defu.lst" /e"defu.err" /d__DEBUG=1
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 1 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 2 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 3 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 4 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 5 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 6 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 7 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 8 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 9 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 10 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 11 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 12 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 13 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 14 : Illegal character (')
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 15 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 15 : Illegal opcode (OSC)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 16 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 16 : Illegal opcode (USE_LFSR)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 17 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 18 : Illegal character (')
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 19 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 19 : Illegal opcode (INTHAND)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 20 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 21 : Illegal character (')
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 23 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 23 : Illegal opcode (LCD_DREG)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 24 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 24 : Illegal opcode (LCD_DBIT)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 25 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 25 : Illegal opcode (LCD_RSREG)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 26 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 26 : Illegal opcode (LCD_RSBIT)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 27 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 27 : Illegal opcode (LCD_EREG)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 28 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 28 : Illegal opcode (LCD_EBIT)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 29 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 29 : Illegal opcode (LCD_BITS)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 30 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 30 : Illegal opcode (LCD_LINES)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 31 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 31 : Illegal opcode (LCD_COMMANDUS)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 32 : Found label after column 1. (DEFINE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 32 : Illegal opcode (LCD_DATAUS)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 34 : Illegal character (')
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 35 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 36 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 37 : Illegal opcode (VAR)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 38 : Illegal character (')
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 39 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 40 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 41 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 42 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 43 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 44 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 45 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 46 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 47 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 48 : Illegal opcode (VAR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 49 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 51 : Found label after column 1. (MOS1)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 51 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 52 : Found label after column 1. (MOS2)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 52 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 53 : Found label after column 1. (PULSE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 53 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 54 : Found label after column 1. (LCDLAMP)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 54 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 55 : Found label after column 1. (RELAY)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 55 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 56 : Found label after column 1. (BUZZER)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 56 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 57 : Found label after column 1. (FAULT)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 57 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 58 : Found label after column 1. (LOCKED)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 58 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 60 : Found label after column 1. (OVERLOAD)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 60 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 61 : Found label after column 1. (FAIL)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 61 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 62 : Found label after column 1. (SYNC)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 62 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 63 : Found label after column 1. (STANDBY)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 63 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 64 : Found label after column 1. (TRICKLE)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 64 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 65 : Found label after column 1. (MENU)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 65 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 66 : Found label after column 1. (INCR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 66 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 67 : Found label after column 1. (DECR)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 67 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 69 : Found label after column 1. (TP1)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 69 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 70 : Found label after column 1. (TP2)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 70 : Illegal opcode (VAR)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 71 : Found label after column 1. (HEARTBEAT)
Error[122]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 71 : Illegal opcode (VAR)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 73 : Illegal character (')
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 74 : Found label after column 1. (LATC)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 74 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 74 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 74 : Missing operator
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 75 : Found label after column 1. (TRISC)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 75 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 76 : Found label after column 1. (PORTC)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 76 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 76 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 76 : Missing operator
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 77 : Found label after column 1. (TRISA)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 77 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 80 : Found label after column 1. (TRISD)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 80 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 81 : Found label after column 1. (PORTD)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 81 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 81 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 81 : Missing operator
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 82 : Found label after column 1. (TRISB)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 82 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 83 : Found label after column 1. (PORTB.4)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 83 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 83 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 83 : Missing operator
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 84 : Found label after column 1. (TRISE)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 84 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 85 : Found label after column 1. (PORTB)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 85 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 85 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 85 : Missing operator
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 86 : Found label after column 1. (ADCON0)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 86 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 87 : Found label after column 1. (ADCON1)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 87 : Missing argument(s)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 89 : Illegal character (')
Warning[203] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 91 : Found opcode in column 1. (GOTO)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 91 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 91 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 91 : Missing operator
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 93 : Illegal character (')
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 98 : Symbol not previously defined (wsave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 99 : Symbol not previously defined (STATUS)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 100 : Symbol not previously defined (STATUS)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 101 : Symbol not previously defined (ssave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 104 : Symbol not previously defined (FSR0)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 105 : Symbol not previously defined (fsave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 106 : Symbol not previously defined (FSR0)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 107 : Symbol not previously defined (fsave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 109 : Symbol not previously defined (INT0IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 109 : Symbol not previously defined (INTCON)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 114 : Symbol not previously defined (INT0IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 114 : Symbol not previously defined (INTCON)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 115 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 115 : Symbol not previously defined (OVERCURRENT)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 118 : Symbol not previously defined (INT1IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 118 : Symbol not previously defined (INTCON3)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 121 : Symbol not previously defined (INT1IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 121 : Symbol not previously defined (INTCON3)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 122 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 122 : Symbol not previously defined (AC)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 123 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 123 : Symbol not previously defined (SYNCOK)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 124 : Symbol not previously defined (INT1IE)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 124 : Symbol not previously defined (INTCON3)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 125 : Symbol not previously defined (INT2IE)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 125 : Symbol not previously defined (INTCON3)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 129 : Symbol not previously defined (INT2IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 129 : Symbol not previously defined (INTCON3)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 131 : Symbol not previously defined (INT2IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 131 : Symbol not previously defined (INTCON3)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 133 : Symbol not previously defined (TMR1H)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 134 : Symbol not previously defined (TMR1L)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 138 : Symbol not previously defined (TMR0IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 138 : Symbol not previously defined (INTCON)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 143 : Symbol not previously defined (INTVAL)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 143 : Symbol not previously defined (TMR0H)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 144 : Symbol not previously defined (INTVAL)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 144 : Symbol not previously defined (TMR0L)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 145 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 145 : Symbol not previously defined (TIM0INT)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 146 : Symbol not previously defined (TMR0IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 146 : Symbol not previously defined (INTCON)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 147 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 147 : Symbol not previously defined (ADCINT)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 148 : Symbol not previously defined (INDEX)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 149 : Symbol not previously defined (INDEX)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 151 : Symbol not previously defined (Z)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 151 : Symbol not previously defined (STATUS)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 153 : Symbol not previously defined (INDEX)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 154 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 154 : Symbol not previously defined (PHASE)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 157 : Symbol not previously defined (fsave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 158 : Symbol not previously defined (FSR0)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 159 : Symbol not previously defined (fsave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 160 : Symbol not previously defined (FSR0)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 161 : Symbol not previously defined (ssave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 162 : Symbol not previously defined (STATUS)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 163 : Symbol not previously defined (wsave)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 164 : Symbol not previously defined (wsave)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 167 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 169 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 173 : Illegal character ($)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 174 : Illegal character (")
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 177 : Illegal character (')
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 178 : Found label after column 1. (PR2)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 178 : Symbol not previously defined (FF)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 178 : Missing operator
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 178 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 178 : Illegal argument (expected single character)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 179 : Found label after column 1. (T2CON)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 179 : Missing argument(s)
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 180 : Found label after column 1. (CCPR1L)
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 180 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 180 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 180 : Missing operator
Warning[207] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 181 : Found label after column 1. (CCP1CON)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 181 : Missing argument(s)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 182 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 184 : Illegal character (')
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 185 : Missing argument(s)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 186 : Symbol not previously defined (FF)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 186 : Missing operator
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 186 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 186 : Illegal argument (expected single character)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 187 : Symbol not previously defined (CA)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 187 : Missing operator
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 187 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 187 : Illegal argument (expected single character)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 188 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 190 : Illegal character (')
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 191 : Missing argument(s)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 192 : Missing argument(s)
Error[128]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 193 : Missing argument(s)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 194 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 196 : Illegal character (')
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 197 : Illegal character (')
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 198 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 198 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 198 : Missing operator
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 199 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 199 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 199 : Missing operator
Warning[209] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 203 : Missing quote
Error[124]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 203 : Illegal argument (expected single character)
Error[112]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 203 : Missing operator
Warning[205] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 204 : Found directive in column 1. (IF)
Error[113]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 204 : Symbol not previously defined (TIM0INT)
Error[108]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 204 : Illegal character (=)
Warning[203] C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 219 : Found opcode in column 1. (GOTO)
Error[129]   C:\USERS\JAGDEEP\PIC18F452\DEFU.ASM 222 : Expected (END)
Halting build on first failure as requested.
----------------------------------------------------------------------
Debug build of project `C:\Users\jagdeep\pic18f452\jj.mcp' failed.
Language tool versions: MPASMWIN.exe v5.44, mplink.exe v9.80, mcc18.exe v9.80, mplib.exe v9.80
Preprocessor symbol `__DEBUG' is defined.
Wed Apr 10 17:57:24 2013
----------------------------------------------------------------------
BUILD FAILED
What Compiler/Assembler are you using? I see both asm and basic code in it. Post the link from where you got that code. Post the error messages you are getting.
 

Replace all the single quotes ' with Semi-colon. ' is used for basic language comment and ; is used for asm language comment.

Labels should start from column 1.


This label is column 1 like below

LABEL1:

Actually the code is a Basic Language Code which has inline assembly code. So, you have to use Basic Compiler. I think you have to use Pic Basic Pro or Proton Development Suite or some other Basic Compiler. You are using MPASMWIN.exe which is not right. It is an assembler. So, Don't replace the single quotes. Find out for which Basic Compiler the program is written for.
 
Last edited:

hii i tried with mikrobasic pro he is giving me this error
Code:
0 1 mBPic.exe -DBG -pP18F452 -MSF -Y -DL -O11111114 -fo10 -N"C:\Users\jagdeep\pic18f452\jhj.mbppi" -SP"C:\Program Files\Mikroelektronika\mikroBasic PRO for PIC\defs\" -SP"C:\Program Files\Mikroelektronika\mikroBasic PRO for PIC\uses\P18\" -SP"C:\Users\jagdeep\pic18f452\" "__Lib_Math.mcl" "__Lib_MathDouble.mcl" "__Lib_System.mcl" "__Lib_Delays.mcl" "__Lib_CType.mcl" "__Lib_String.mcl" "__Lib_Conversions.mcl" "__Lib_Time.mcl" "__Lib_Trigon.mcl" "__Lib_Trigonometry.mcl" "__Lib_Button.mcl" "__Lib_Keypad4x4.mcl" "__Lib_Manchester.mcl" "__Lib_OneWire.mcl" "__Lib_PS2.mcl" "__Lib_Sound.mcl" "__Lib_SoftI2C.mcl" "__Lib_SoftSPI.mcl" "__Lib_SoftUART.mcl" "__Lib_ADC_A_C.mcl" "__Lib_EEPROM_256.mcl" "__Lib_FLASH_w8_e64.mcl" "__Lib_I2C_c34.mcl" "__Lib_PWM_c21.mcl" "__Lib_SPI_c345.mcl" "__Lib_UART_c67.mcl" "__Lib_PortExpander.mcl" "__Lib_CANSPI.mcl" "__Lib_CF.mcl" "__Lib_CFFat16.mcl" "__Lib_GlcdFonts.mcl" "__Lib_Glcd.mcl" "__Lib_LcdConsts.mcl" "__Lib_Lcd.mcl" "__Lib_Mmc.mcl" "__Lib_MmcFat16.mcl" "__Lib_RS485.mcl" "__Lib_T6963C.mcl" "__Lib_SPIGlcd.mcl" "__Lib_SPILcd.mcl" "__Lib_SPILcd8.mcl" "__Lib_SPIT6963C.mcl" "__Lib_EthEnc28j60.mcl" "jhj.mbas"  
0 132 Compilation Started C:\Users\jagdeep\pic18f452\jhj.mbas
1 1015 Hint: Compiling unit "C:\Users\jagdeep\pic18f452\jhj.mbas" jhj.mbas
15 304 Syntax error: Expected "program" but ""DEFINE"" found jhj.mbas
0 102 Finished (with errors): 10 apr 2013, 19:16:58 jhj.mbppi
Replace all the single quotes ' with Semi-colon. ' is used for basic language comment and ; is used for asm language comment.

Labels should start from column 1.


This label is column 1 like below

LABEL1:

Actually the code is a Basic Language Code which has inline assembly code. So, you have to use Basic Compiler. I think you have to use Pic Basic Pro or Proton Development Suite or some other Basic Compiler. You are using MPASMWIN.exe which is not right. It is an assembler. So, Don't replace the single quotes. Find out for which Basic Compiler the program is written for.
 

Status
Not open for further replies.

Similar threads

Part and Inventory Search

Welcome to EDABoard.com

Sponsor

Back
Top