To enable the dark theme, use
:- use_module(library(theme/dark)).
pldoc_style:theme(+Element, +Condition, -CSSAttributes) is semidet[multifile]- Return a set of CSS properties to modify on the specified Element if
Condition holds.
color(Name) is mapped to fg(Name) and
color(bright_Name) to hfg(Name).
style(+Class, -Style)[private]- Map style classes defined in library(prolog_colour) to xpce style
objects. After making modifications the effect can be tested without
restarting using this sequence:
- Run
?- make in Prolog
- In the editor, use
M-x reload_styles
pce_set_defaults(+Loaded)[private]- Adjust xpce defaults. This can either be run before xpce is loaded
or as part of the xpce initialization.
pce_style(+Class, -Attributes)[private]- Set XPCE class variables for Class. This is normally done by loading
a resource file, but doing it from Prolog keeps the entire theme
in a single file.
- prolog_source_view:port_style(+Port, -StyleAttributes)[private]
- Override style attributes for indicating a specific port in the
source view. Ports are:
call, break, exit, redo, fail,
exception, unify, choice, `frame and breakpoint.