application_controller

DATA TYPES

appname() = atom()
calls() = info | prep_config_change | which_applications | {config_change | control_application | load_application | start_type | stop_application | unload_application, term()} | {change_application_data, term(), term()} | {permit_application, atom() | {application, atom(), term()}, term()} | {start_application, term(), term()} | {unset_env, term(), term()} | {set_env, term(), term(), term()}
state() = #state{}

Functions


start(KernelApp) -> term()

load_application(Application) -> term()

unload_application(AppName) -> term()

start_application(AppName, RestartType) -> term()

start_boot_application(Application, RestartType) -> term()

stop_application(AppName) -> term()

which_applications() -> term()

which_applications(Timeout) -> term()

loaded_applications() -> term()

info() -> term()

control_application(AppName) -> term()

change_application_data(Applications, Config) -> term()

prep_config_change() -> term()

config_change(EnvPrev) -> term()

get_pid_env(Master, Key) -> term()

get_env(AppName, Key) -> term()

get_pid_all_env(Master) -> term()

get_all_env(AppName) -> term()

get_pid_key(Master, Key) -> term()

get_key(AppName, Key) -> term()

get_pid_all_key(Master) -> term()

get_all_key(AppName) -> term()

start_type(Master) -> term()

get_master(AppName) -> term()

get_application(Master) -> term()

get_application_module(Module) -> term()

permit_application(ApplName, Flag) -> term()

set_env(AppName, Key, Val) -> term()

set_env(AppName, Key, Val, Timeout) -> term()

unset_env(AppName, Key) -> term()

unset_env(AppName, Key, Timeout) -> term()

handle_call(X1::calls(), From::{pid(), term()}, S::state()) -> {noreply, state()} | {reply, term(), state()}

handle_cast(X1::{application_started, appname(), term()}, S::state()) -> {noreply, state()} | {stop, string(), state()}

handle_info(X1::term(), S::state()) -> {noreply, state()} | {stop, string(), state()}

terminate(Reason::term(), S::state()) -> ok

code_change(OldVsn::term(), State::state(), Extra::term()) -> {ok, state()}

get_loaded(App) -> term()

init_starter(From, Appl, S, Type) -> term()

do_config_diff(AppEnvNow, AppEnvBefore) -> term()

test_change_apps(Apps, Conf) -> term()

View Functions