Skip to content

Commit

Permalink
FIXED: library(prolog_colour): misleading colouring of Dict.field
Browse files Browse the repository at this point in the history
Field was flagged as an error (`no_function`).
  • Loading branch information
JanWielemaker committed Jan 5, 2025
1 parent 54fdcbe commit 0105b4d
Showing 1 changed file with 6 additions and 5 deletions.
11 changes: 6 additions & 5 deletions library/prolog_colour.pl
Original file line number Diff line number Diff line change
Expand Up @@ -1672,11 +1672,12 @@
!,
( dict_field_extraction(Compound)
-> colourise_term_arg(Compound, TB, Pos)
; current_arithmetic_function(Compound)
-> colour_item(function, TB, FF-FT)
; colour_item(no_function, TB, FF-FT)
),
colourise_expression_args(Compound, TB, Pos).
; ( current_arithmetic_function(Compound)
-> colour_item(function, TB, FF-FT)
; colour_item(no_function, TB, FF-FT)
),
colourise_expression_args(Compound, TB, Pos)
).
colourise_expression(Atom, TB, Pos) :-
atom(Atom),
!,
Expand Down

0 comments on commit 0105b4d

Please sign in to comment.