1
Files
flake-nixinator/config/neovim/store/nvim-treesitter/queries/ocaml/highlights.scm

324 lines
3.9 KiB
Scheme

; Modules
;--------
[
(module_name)
(module_type_name)
] @module
; Types
;------
((type_constructor) @type.builtin
(#any-of? @type.builtin
"int" "char" "bytes" "string" "float" "bool" "unit" "exn" "array" "list" "option" "int32"
"int64" "nativeint" "format6" "lazy_t"))
[
(class_name)
(class_type_name)
(type_constructor)
] @type
[
(constructor_name)
(tag)
] @constructor
; Variables
;----------
[
(value_name)
(type_variable)
] @variable
(value_pattern) @variable.parameter
; Functions
;----------
(let_binding
pattern: (value_name) @function
(parameter))
(let_binding
pattern: (value_name) @function
body: [
(fun_expression)
(function_expression)
])
(value_specification
(value_name) @function)
(external
(value_name) @function)
(method_name) @function.method
; Application
;------------
(infix_expression
left: (value_path
(value_name) @function.call)
operator: (concat_operator) @_operator
(#eq? @_operator "@@"))
(infix_expression
operator: (rel_operator) @_operator
right: (value_path
(value_name) @function.call)
(#eq? @_operator "|>"))
(application_expression
function: (value_path
(value_name) @function.call))
((value_name) @function.builtin
(#any-of? @function.builtin "raise" "raise_notrace" "failwith" "invalid_arg"))
; Fields
;-------
[
(field_name)
(instance_variable_name)
] @variable.member
; Labels
; ------
(label_name) @label
; Constants
;----------
; Don't let normal parens take priority over this
((unit) @constant.builtin
(#set! "priority" 105))
(boolean) @boolean
[
(number)
(signed_number)
] @number
(character) @character
(string) @string
(quoted_string
"{" @string
"}" @string) @string
(escape_sequence) @string.escape
[
(conversion_specification)
(pretty_printing_indication)
] @string.special
; Keywords
;---------
[
"and"
"as"
"assert"
"begin"
"constraint"
"end"
"external"
"in"
"inherit"
"initializer"
"let"
"match"
"method"
"module"
"new"
"of"
"sig"
"val"
"when"
"with"
] @keyword
[
"object"
"class"
"struct"
"type"
] @keyword.type
[
"lazy"
"mutable"
"nonrec"
"rec"
"private"
"virtual"
] @keyword.modifier
[
"fun"
"function"
"functor"
] @keyword.function
[
"if"
"then"
"else"
] @keyword.conditional
[
"exception"
"try"
] @keyword.exception
[
"include"
"open"
] @keyword.import
[
"for"
"to"
"downto"
"while"
"do"
"done"
] @keyword.repeat
; Punctuation
;------------
(attribute
[
"[@"
"]"
] @punctuation.special)
(item_attribute
[
"[@@"
"]"
] @punctuation.special)
(floating_attribute
[
"[@@@"
"]"
] @punctuation.special)
(extension
[
"[%"
"]"
] @punctuation.special)
(item_extension
[
"[%%"
"]"
] @punctuation.special)
(quoted_extension
[
"{%"
"}"
] @punctuation.special)
(quoted_item_extension
[
"{%%"
"}"
] @punctuation.special)
"%" @punctuation.special
[
"("
")"
"["
"]"
"{"
"}"
"[|"
"|]"
"[<"
"[>"
] @punctuation.bracket
(object_type
[
"<"
">"
] @punctuation.bracket)
[
","
"."
";"
":"
"="
"|"
"~"
"?"
"+"
"-"
"!"
">"
"&"
"->"
";;"
":>"
"+="
":="
".."
] @punctuation.delimiter
; Operators
;----------
[
(prefix_operator)
(sign_operator)
(pow_operator)
(mult_operator)
(add_operator)
(concat_operator)
(rel_operator)
(and_operator)
(or_operator)
(assign_operator)
(hash_operator)
(indexing_operator)
(let_operator)
(and_operator)
(match_operator)
] @operator
(match_expression
(match_operator) @keyword)
(value_definition
[
(let_operator)
(let_and_operator)
] @keyword)
[
"*"
"#"
"::"
"<-"
] @operator
; Attributes
;-----------
(attribute_id) @attribute
; Comments
;---------
[
(comment)
(line_number_directive)
(directive)
] @comment @spell
(shebang) @keyword.directive