Skip to content

Commit

Permalink
remove whitespace and fix indentation
Browse files Browse the repository at this point in the history
  • Loading branch information
PizieDust committed Feb 21, 2024
1 parent 1209b8c commit 55350b0
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 7 deletions.
12 changes: 6 additions & 6 deletions src/analysis/jump.ml
Original file line number Diff line number Diff line change
Expand Up @@ -187,16 +187,16 @@ let get typed_tree pos target =
in
if String.length target = 0 then
`Error "Specify target"
else begin
else
let nodes = skip_non_moving pos enclosings in
let node = find_node preds nodes in
match target with
match target with
| "match-next-case" -> find_case_pos (get_cases_from_match node) pos Next
| "match-prev-case" -> find_case_pos (List.rev (get_cases_from_match node)) pos Prev
| "match-prev-case" ->
find_case_pos (List.rev (get_cases_from_match node)) pos Prev
| _ ->
let node_loc = Browse_raw.node_real_loc Location.none node in
`Found node_loc.Location.loc_start
end
let node_loc = Browse_raw.node_real_loc Location.none node in
`Found node_loc.Location.loc_start
with
| No_predicate target ->
`Error ("No predicate for " ^ target)
Expand Down
2 changes: 1 addition & 1 deletion src/analysis/jump.mli
Original file line number Diff line number Diff line change
Expand Up @@ -31,7 +31,7 @@ val get :
Mtyper.typedtree ->
Std.Lexing.position ->
string -> [> `Error of string | `Found of Lexing.position ]

val phrase :
Mtyper.typedtree ->
Std.Lexing.position ->
Expand Down

0 comments on commit 55350b0

Please sign in to comment.