Learn More About JQuary and Apex

Hi Jari,
i want to learn more about JQuary
[http://actionet.homelinux.net/htmldb/f?p=100:90|http://actionet.homelinux.net/htmldb/f?p=100:90]
i have seen that demo application, there are more features to learn more about apex ,could you please give me login details .
i want to see how to use Code and JQuary in APEX.
Thanks

Hi Jari,
when i run Packages_procedure then show me error
URL Enclosed SQL length exceeds allowed 32k limit.
CREATE OR REPLACE PACKAGE "CSV_UTIL"
as
By Oleg Lihvoinen:
Parse and de_quote procedures are taken from AskTom and modified
    type vcArray is table of varchar2(32767) index by binary_integer;
    g_words            vcArray;
    g_empty            vcArray;
    g_last_string    varchar2(32767); 
  procedure parse( p_str      in varchar2,
                   p_enc_by in varchar2,
                   p_sep   in varchar2 );
  procedure upload(p_file_name VARCHAR2, p_collection_name VARCHAR2, p_enc_by IN VARCHAR2, p_sep_by IN VARCHAR2, p_rows NUMBER);
  function de_quote( p_str in varchar2, 
                       p_enc_by in varchar2 )
    return varchar2;
end;
  CREATE OR REPLACE PACKAGE BODY "CSV_UTIL"
AS
   FUNCTION de_quote (p_str IN VARCHAR2, p_enc_by IN VARCHAR2)
      RETURN VARCHAR2
   IS
   v_str VARCHAR2(32767) := p_str;
   BEGIN
      IF (p_enc_by IS NULL)
      THEN
         RETURN p_str;
      ELSE
        IF SUBSTR(p_str,-1) = p_enc_by THEN
           v_str := SUBSTR(p_str,1,LENGTH(p_str)-1);
        END IF;
        IF SUBSTR(p_str,1,1) = p_enc_by THEN
           v_str := SUBSTR(v_str,2);
        END IF; 
        RETURN REPLACE (v_str,
                         p_enc_by || p_enc_by,
                         p_enc_by
      END IF;
   END de_quote;
   PROCEDURE parse (p_str IN VARCHAR2, p_enc_by IN VARCHAR2, p_sep IN VARCHAR2)
   IS
      l_n          NUMBER   DEFAULT 1;
      l_in_quote   BOOLEAN  DEFAULT FALSE;
      l_ch         NCHAR (1);
      l_len        NUMBER   DEFAULT NVL (LENGTH (p_str), 0);
   BEGIN
      IF (l_len = 0)
      THEN
         RETURN;
      END IF;
      g_words := g_empty;
      g_words (1) := NULL;
      FOR i IN 1 .. l_len
      LOOP
         l_ch := SUBSTR (p_str, i, 1);
         IF (l_ch = p_enc_by)
         THEN
            l_in_quote := NOT l_in_quote;
         END IF;
         IF (l_ch = p_sep AND NOT l_in_quote)
         THEN
            l_n := l_n + 1;
            g_words (l_n) := NULL;
         ELSE
            g_words (l_n) := g_words (l_n) || l_ch;
         END IF;
      END LOOP;
      g_words (l_n) := de_quote (g_words (l_n), CHR(10));
      g_words (l_n) := de_quote (g_words (l_n), CHR(13));
      FOR i IN 1 .. l_n
      LOOP
         g_words (i) := de_quote (g_words (i), p_enc_by);
      END LOOP;
   END parse;
Author: Oleg Lihvoinen
Company: DbSWH
   PROCEDURE upload (p_file_name VARCHAR2, p_collection_name VARCHAR2, p_enc_by IN VARCHAR2, p_sep_by IN VARCHAR2, p_rows NUMBER)
   IS
      v_blob_data    BLOB;
      v_clob_data    CLOB;
      v_clob_len     NUMBER;
      v_position     NUMBER;
      v_char         NCHAR (1);
      c_chunk_len    NUMBER           := 1;
      v_line         VARCHAR2 (32767) := NULL;
      v_data_array   vcarray;
      v_rows         NUMBER           := 0;
      n_seq          NUMBER           := 1;
      dest_offset    NUMBER           := 1;
      src_offset     NUMBER           := 1;
      amount         INTEGER          := DBMS_LOB.lobmaxsize;
      blob_csid      NUMBER           := DBMS_LOB.default_csid;
      lang_ctx       INTEGER          := DBMS_LOB.default_lang_ctx;
      warning        INTEGER;
      l_sep          VARCHAR2(100)    := CASE WHEN p_sep_by = '\t' THEN chr(9) ELSE p_sep_by END;
   BEGIN
      htmldb_collection.create_or_truncate_collection
                                      (p_collection_name      => p_collection_name);
      -- Read blob from wwv_flow_files
      SELECT blob_content
        INTO v_blob_data
        FROM wwv_flow_files
       WHERE NAME = p_file_name;
      v_position := 1;
      DBMS_LOB.createtemporary (lob_loc      => v_clob_data,
                                CACHE        => TRUE,
                                dur          => DBMS_LOB.SESSION
      DBMS_LOB.converttoclob (v_clob_data,
                              v_blob_data,
                              amount,
                              dest_offset,
                              src_offset,
                              blob_csid,
                              lang_ctx,
                              warning
      v_clob_len := DBMS_LOB.getlength (v_clob_data);
      IF v_clob_len = 0 THEN
         RETURN;
      END IF;
      WHILE (v_position <= v_clob_len)
      LOOP
         v_char := DBMS_LOB.SUBSTR (v_clob_data, c_chunk_len, v_position);
         v_line := v_line || v_char;
         v_position := v_position + c_chunk_len;
         -- When the whole line is retrieved and not end of file or end of file
         IF v_char = CHR (10) AND v_position < v_clob_len OR v_position = v_clob_len
         THEN
            parse (p_str => v_line, p_enc_by => p_enc_by, p_sep => l_sep);
            v_data_array := g_words;
            FOR i IN 1..g_words.count LOOP
               IF i <= 50 THEN
                  v_data_array(i) := g_words(i);
               ELSE
                  exit;
               END IF;
            END LOOP;
            FOR i IN g_words.count + 1..50 LOOP
               v_data_array(i) := null;
            END LOOP;           
            v_rows := v_rows + 1;
            -- exit if uploaded specified number of rows
            IF p_rows IS NOT NULL AND v_rows > p_rows THEN
               EXIT;
            END IF;
            -- Store data to collection
            n_seq :=
               htmldb_collection.add_member
                                     (p_collection_name      => p_collection_name,
                                      p_c001                 => v_data_array
                                                                           (1),
                                      p_c002                 => v_data_array
                                                                           (2),
                                      p_c003                 => v_data_array
                                                                           (3),
                                      p_c004                 => v_data_array
                                                                           (4),
                                      p_c005                 => v_data_array
                                                                           (5),
                                      p_c006                 => v_data_array
                                                                           (6),
                                      p_c007                 => v_data_array
                                                                           (7),
                                      p_c008                 => v_data_array
                                                                           (8),
                                      p_c009                 => v_data_array
                                                                           (9),
                                      p_c010                 => v_data_array
                                                                           (10),
                                      p_c011                 => v_data_array
                                                                           (11),
                                      p_c012                 => v_data_array
                                                                           (12),
                                      p_c013                 => v_data_array
                                                                           (13),
                                      p_c014                 => v_data_array
                                                                           (14),
                                      p_c015                 => v_data_array
                                                                           (15),
                                      p_c016                 => v_data_array
                                                                           (16),
                                      p_c017                 => v_data_array
                                                                           (17),
                                      p_c018                 => v_data_array
                                                                           (18),
                                      p_c019                 => v_data_array
                                                                           (19),
                                      p_c020                 => v_data_array
                                                                           (20),
                                      p_c021                 => v_data_array
                                                                           (21),
                                      p_c022                 => v_data_array
                                                                           (22),
                                      p_c023                 => v_data_array
                                                                           (23),
                                      p_c024                 => v_data_array
                                                                           (24),
                                      p_c025                 => v_data_array
                                                                           (25),
                                      p_c026                 => v_data_array
                                                                           (26),
                                      p_c027                 => v_data_array
                                                                           (27),
                                      p_c028                 => v_data_array
                                                                           (28),
                                      p_c029                 => v_data_array
                                                                           (29),
                                      p_c030                 => v_data_array
                                                                           (30),
                                      p_c031                 => v_data_array
                                                                           (31),
                                      p_c032                 => v_data_array
                                                                           (32),
                                      p_c033                 => v_data_array
                                                                           (33),
                                      p_c034                 => v_data_array
                                                                           (34),
                                      p_c035                 => v_data_array
                                                                           (35),
                                      p_c036                 => v_data_array
                                                                           (36),
                                      p_c037                 => v_data_array
                                                                           (37),
                                      p_c038                 => v_data_array
                                                                           (38),
                                      p_c039                 => v_data_array
                                                                           (39),
                                      p_c040                 => v_data_array
                                                                           (40),
                                      p_c041                 => v_data_array
                                                                           (41),
                                      p_c042                 => v_data_array
                                                                           (42),
                                      p_c043                 => v_data_array
                                                                           (43),
                                      p_c044                 => v_data_array
                                                                           (44),
                                      p_c045                 => v_data_array
                                                                           (45),
                                      p_c046                 => v_data_array
                                                                           (46),
                                      p_c047                 => v_data_array
                                                                           (47),
                                      p_c048                 => v_data_array
                                                                           (48),
                                      p_c049                 => v_data_array
                                                                           (49),
                                      p_c050                 => v_data_array
                                                                           (50)                                                                          
            -- Clear the line
            v_line := NULL;
         END IF;
      END LOOP;
   END;
END;
This package is from AskTom web site.
Modified a bit.
  CREATE OR REPLACE PACKAGE "OLS_PRINT_SYLK_FORMAT" as
  type owaSylkArray is table of varchar2(2000);
  procedure show(
      p_query         in varchar2,
      p_parm_names    in owaSylkArray default owaSylkArray(),
      p_parm_values   in owaSylkArray default owaSylkArray(),
      p_sum_column    in owaSylkArray default owaSylkArray(),
      p_max_rows      in number     default 10000,
      p_show_null_as  in varchar2   default null,
      p_show_grid     in varchar2   default 'YES',
      p_show_col_headers in varchar2 default 'YES',
      p_font_name     in varchar2   default 'Courier New',
      p_widths        in owaSylkArray default owaSylkArray(),
      p_titles        in owaSylkArray default owaSylkArray(),
      p_strip_html    in varchar2   default 'YES' );
  procedure show(
      p_cursor        in integer,
      p_sum_column    in owaSylkArray  default owaSylkArray(),
      p_max_rows      in number     default 10000,
      p_show_null_as  in varchar2   default null,
      p_show_grid     in varchar2   default 'YES',
      p_show_col_headers in varchar2 default 'YES',
      p_font_name     in varchar2   default 'Courier New',
      p_widths        in owaSylkArray default owaSylkArray(),
      p_titles        in owaSylkArray default owaSylkArray(),
      p_strip_html    in varchar2   default 'YES' );
  PROCEDURE get_usable_sql (p_sql_in IN VARCHAR2, p_sql_out OUT VARCHAR2);
end ols_print_sylk_format;
  CREATE OR REPLACE PACKAGE BODY "OLS_PRINT_SYLK_FORMAT" as
  g_cvalue  varchar2(32767);
  g_desc_t dbms_sql.desc_tab2;
  type vc_arr is table of varchar2(2000) index by binary_integer;
  g_lengths vc_arr;
  g_sums vc_arr;
  procedure p( p_str in varchar2 )
  is
  len NUMBER;
  begin
    htp.p(p_str);
    --dbms_output.put_line(p_str);
  exception
    when others then null;
  end;
  function build_cursor(
      q in varchar2,
      n in owaSylkArray,
      v in owaSylkArray ) return integer is
    c integer := dbms_sql.open_cursor;
    i number := 1;
  begin
    dbms_sql.parse (c, q, dbms_sql.native);
    loop
      dbms_sql.bind_variable( c, n(i), v(i) );
      i := i + 1;
    end loop;
    return c;
  exception
    when others then
      return c;
  end build_cursor;
  function str_html ( line in varchar2 ) return varchar2 is
    x       varchar2(32767) := null;
    in_html boolean         := FALSE;
    s       varchar2(3);
  begin
    if line is null then
      return line;
    end if;
    for i in 1 .. length( line ) loop
      s := substr( line, i, 1 );
      if in_html then
        if s = '>' then
          in_html := FALSE;
        end if;
      else
        if s = '<' then
          in_html := TRUE;
        end if;
      end if;
      if not in_html and s != '>' then
        x := x || s;
      end if;
    end loop;
    return x;
  end str_html;
  function ite( b boolean,
                t varchar2,
                f varchar2 ) return varchar2 is
  begin
    if b then
      return t;
    else
      return f;
    end if;
  end ite;
  procedure print_comment( p_comment varchar2 ) is
  begin
    return;
    p( ';' || chr(10) || '; ' || p_comment || chr(10) || ';' );
  end print_comment;
  procedure print_heading( font in varchar2,
                           grid in varchar2,
                           col_heading in varchar2,
                           titles in owaSylkArray )
  is
    l_title varchar2(2000);
  begin
    p( 'ID;DBSWHWEBSHOP' );
    print_comment( 'Fonts' );
    p( 'P;F' || font || ';M200' );
    p( 'P;F' || font || ';M200;SB' );
    p( 'P;F' || font || ';M200;SUB' );
    print_comment( 'Global Formatting' );
    --p( 'F;C1;FG0R;SM1' ||
    p( 'F;C1;FG0L;SM0' ||
           ite( upper(grid)='YES', '', ';G' ) ||
           ite( upper(col_heading)='YES', '', ';H' )  );
    for i in 1 .. g_desc_t.count loop
      --p( 'F;C' || to_char(i+1) || ';FG0R;SM0' );
      p( 'F;C' || to_char(i+1) || ';FG0L;SM0' );
    end loop;
    print_comment( 'Title Row' );
    p( 'F;R1;FG0C;SM2' );
    for i in 1 .. g_desc_t.count loop
      g_lengths(i) := g_desc_t(i).col_name_len;
      g_sums(i) := 0;
      begin
        l_title := titles(i);
      exception
        when others then
          l_title := g_desc_t(i).col_name;
      end;
      if i = 1 then
        --p( 'C;Y1;X2;K"' || l_title || '"' );
        p( 'C;Y1;X1;K"' || l_title || '"' );
      else
        --p( 'C;X' || to_char(i+1) || ';K"' || l_title || '"' );
        p( 'C;X' || to_char(i) || ';K"' || l_title || '"' );
      end if;
    end loop;
  end print_heading;
  function print_rows(
      c            in integer,
      max_rows     in number,
      sum_columns  in owaSylkArray,
      show_null_as in varchar2,
      strip_html   in varchar2 ) return number is
    row_cnt number          := 0;
    line    varchar2(32767) := null;
    n       number;
  begin
    loop
      exit when ( row_cnt >= max_rows or
                  dbms_sql.fetch_rows( c ) <= 0 );
      row_cnt := row_cnt + 1;
      print_comment( 'Row ' || row_cnt );
      p( 'C;Y' || to_char(row_cnt+1) );
      for i in 1 .. g_desc_t.count loop
        dbms_sql.column_value( c, i, g_cvalue );
        g_cvalue := trim( both chr(10) from g_cvalue );
        g_cvalue := trim( both chr(13) from g_cvalue );       
        g_cvalue := translate( g_cvalue,
                            chr(13)||chr(10)||chr(9)||';', '    ' );
        g_cvalue := ite( upper( strip_html ) = 'YES',
                             str_html( g_cvalue ),
                             g_cvalue );
        g_lengths(i) := greatest( nvl(length(g_cvalue),
                                  nvl(length(show_null_as),0)),
                                  g_lengths(i) );
        line := 'C;X' || to_char(i);
        line := line || ';K';
        begin
          n := to_number( g_cvalue );
          if upper( sum_columns(i)) = 'Y' then
            g_sums(i) := g_sums(i) + nvl(n,0);
          end if;
        exception
          when others then
            n := null;
        end;
        line := line ||
                 ite( n is null,
                      ite( g_cvalue is null,
                               '"'||show_null_as||
                                  '"', '"'||g_cvalue||'"' ),
                             n );
        p( line );
      end loop;
    end loop;
    return row_cnt;
  end print_rows;
  procedure print_sums(
      sum_columns  in owaSylkArray,
      row_cnt      in number ) is
  begin
    if sum_columns.count = 0 then
      return;
    end if;
    print_comment( 'Totals Row' );
    p( 'C;Y' || to_char(row_cnt + 4) );
    p( 'C;X1;K"Totals:"' );
    for i in 1 .. g_desc_t.count loop
      begin
        if upper(sum_columns(i)) = 'Y' then
          p( 'C;X' || to_char(i+1) || ';ESUM(R3C:R' ||
                  to_char(row_cnt+2) || 'C)' );
        end if;
      exception
        when others then
          null;
      end;
    end loop;
  end print_sums;
  procedure print_widths( widths owaSylkArray ) is
  begin
    print_comment( 'Format Column Widths' );
    --p( 'F;W1 1 7' );
    for i in 1 .. g_desc_t.count loop
      begin
        --p( 'F;W' || to_char(i+1) || ' ' ||
            --to_char(i+1) || ' ' ||
        p( 'F;W' || to_char(i) || ' ' ||
            to_char(i) || ' ' ||
            to_char(to_number(widths(i))) );
      exception
        when others then
          --p( 'F;W' || to_char(i+1) || ' ' ||
               --to_char(i+1) || ' ' ||
          p( 'F;W' || to_char(i) || ' ' ||
               to_char(i) || ' ' || 
               greatest( g_lengths(i), length( g_sums(i) )));
      end;
    end loop;
    p( 'E' );
  end print_widths;
  procedure show(
      p_cursor        in integer,
      p_sum_column    in owaSylkArray default owaSylkArray(),
      p_max_rows      in number     default 10000,
      p_show_null_as  in varchar2   default null,
      p_show_grid     in varchar2   default 'YES',
      p_show_col_headers in varchar2 default 'YES',
      p_font_name     in varchar2   default 'Courier New',
      p_widths        in owaSylkArray default owaSylkArray(),
      p_titles        in owaSylkArray default owaSylkArray(),
      p_strip_html    in varchar2   default 'YES' ) is
    l_row_cnt number;
    l_col_cnt number;
    l_status  number;
  begin
    dbms_sql.describe_columns2( p_cursor, l_col_cnt, g_desc_t );
    for i in 1 .. g_desc_t.count loop
      dbms_sql.define_column( p_cursor, i, g_cvalue, 32765);
    end loop;
    print_heading( p_font_name,
                   p_show_grid,
                   p_show_col_headers,
                   p_titles );
    l_status := dbms_sql.execute( p_cursor );
    l_row_cnt := print_rows(
                   p_cursor,
                   p_max_rows,
                   p_sum_column,
                   p_show_null_as,
                   p_strip_html );
    print_sums( p_sum_column, l_row_cnt );
    print_widths( p_widths );
  end show;
  procedure show(
      p_query         in varchar2,
      p_parm_names    in owaSylkArray default owaSylkArray(),
      p_parm_values   in owaSylkArray default owaSylkArray(),
      p_sum_column    in owaSylkArray default owaSylkArray(),
      p_max_rows      in number     default 10000,
      p_show_null_as  in varchar2   default null,
      p_show_grid     in varchar2   default 'YES',
      p_show_col_headers in varchar2 default 'YES',
      p_font_name     in varchar2   default 'Courier New',
      p_widths        in owaSylkArray default owaSylkArray(),
      p_titles        in owaSylkArray default owaSylkArray(),
      p_strip_html    in varchar2   default 'YES' ) is
  begin
    show( p_cursor => build_cursor( p_query,
                                    p_parm_names,
                                    p_parm_values ),
          p_sum_column => p_sum_column,
          p_max_rows => p_max_rows,
          p_show_null_as => p_show_null_as,
          p_show_grid => p_show_grid,
          p_show_col_headers => p_show_col_headers,
          p_font_name => p_font_name,
          p_widths => p_widths,
          p_titles => p_titles,
          p_strip_html => p_strip_html );
  end show;
   PROCEDURE get_usable_sql (p_sql_in IN VARCHAR2, p_sql_out OUT VARCHAR2)
   IS
      v_sql      VARCHAR2 (32767);
      v_names    DBMS_SQL.varchar2_table;
      v_pos      NUMBER;
      v_length   NUMBER;
      v_exit     NUMBER;
   BEGIN
      v_sql := p_sql_in;
      v_names := wwv_flow_utilities.get_binds (v_sql);
      FOR i IN 1 .. v_names.COUNT
      LOOP
         <<do_it_again>>
         v_pos := INSTR (LOWER (v_sql), LOWER (v_names (i)));
         v_length := LENGTH (LOWER (v_names (i)));
         v_sql :=
               SUBSTR (v_sql, 1, v_pos - 1)
            || v_names (i)
            || SUBSTR (v_sql, v_pos + v_length);
         v_sql :=
            REPLACE (v_sql,
                     UPPER (v_names (i)),
                        '(SELECT v('''
                     || LTRIM (v_names (i), ':')
                     || ''') FROM DUAL)'
         IF INSTR (LOWER (v_sql), LOWER (v_names (i))) > 0
         THEN
            GOTO do_it_again;
         END IF;
      END LOOP;
      p_sql_out := v_sql;
   END get_usable_sql;
end ols_print_sylk_format;
  CREATE OR REPLACE PROCEDURE "PRINT_SYLK" AS
v_region_sql VARCHAR2(32767);
v_plug_source_type VARCHAR2(32767);
v_filenm VARCHAR2(2000);
l_cursor NUMBER := dbms_sql.open_cursor;
BEGIN
     SELECT region_source, source_type
     INTO  v_region_sql, v_plug_source_type
     FROM  apex_application_page_regions
     WHERE region_id      = to_number(LTRIM(v('REGIONID'),   'R'))
     AND   page_id = v('APP_PAGE_ID');
  -- Apex 2.1 if v_plug_source_type like 'SQL%' then
  if v_plug_source_type like 'Report' then -- Apex 3.2.1
     ols_print_sylk_format.get_usable_sql(v_region_sql,   v_region_sql);
  else
     v_region_sql := upper(v_region_sql);
     v_region_sql := replace(v_region_sql,'BEGIN',' ');
     v_region_sql := replace(v_region_sql,'RETURN ',' ');
     v_region_sql := replace(v_region_sql,';',' ');
     v_region_sql := replace(v_region_sql,'END',' ');
     execute immediate 'select ' || v_region_sql ||
                       ' from dual ' into v_region_sql;
  end if;
  v_filenm := v('EXCELNAME') || '.xls';
  owa_util.mime_header('application/vnd.ms-excel',   FALSE);
   -- Set up HTTP header
  htp.p('Content-Disposition: attachment; filename="' || v_filenm || '"');
      -- Close the headers
   owa_util.http_header_close;
   dbms_sql.parse(l_cursor,   v_region_sql,   dbms_sql.native);
   ols_print_sylk_format.SHOW(p_cursor => l_cursor,   p_max_rows => 60000);
   dbms_sql.close_cursor(l_cursor);                               
   HTMLDB_APPLICATION.g_unrecoverable_error := TRUE;     
END PRINT_SYLK;
How can i remove it.
Thanks

Similar Messages

  • Want to learn more about BDC.

    Hi all,
             I am new to BDC and want o learn more about it and how it works. Can you please help me out in these.
             Please send any docs if any in [email protected]
          With regards,
            Abir.

    Hi,
       Have a look at these links-
    BDC
    http://www.sap-img.com/bdc.htm
    www.sappoint.com/abap/bdcconcept.pdf
    www.sap-img.com/abap/learning-bdc-programming.htm
    www.sap-img.com/abap/question-about-bdc-program.htm
    www.sapdevelopment.co.uk/bdc/bdchome.htm
    www.planetsap.com/bdc_main_page.htm
    Re: bdc mm01
    Table control in BDC
    http://www.sap-img.com/abap/bdc-example-using-table-control-in-bdc.htm
    Mark helpful answers.
    Regards,
    Tanuja.

  • To the left are 3 balls, red, yello, green, that go around in a circle. when i click on them it says download helper, what is that for and how do I learn more about them?

    to the left of the URL are 3 balls, red, yellow, green, that go around in a circle. when i click on them it says download helper, what is that for and how do I learn more about them?

    Thanks, this is very helpful, and resolved my question
    dan

  • I would like to learn more about the API associated with contract and  pric

    Hi
    I would like to learn more about the API associated with contract and pricing agreements in advanced pricing modules os Oracle 11i and also get functional knowledge.
    Please note that, I have almost no knowledge about oracle oracle ERP system.
    Please advice, where do I start.
    thanks
    siva

    Please read Oracle Applications Developer's Guide .

  • Where can I learn more about Siri?

    Siri works pretty well for me (for a Beta component) since I do not have a strong regional accent,  but I want to learn more about what it can do, how best to pose questions for successful interactions and follow its progress as it is updated by Apple. Any suggestions for good resources?

    Here's a place to start: Learn more about Siri

  • Where can I learn more about the Logic Environment?

    I've been using LogicPro for a while now - since version 7 came out - and I'm ready to learn more about the mysterious Logic Environment. Anyone know of a good tutorial or website on this topic? I don't have a specific question - what I need is a general overview.
    My sessions are primarily audio recording and mixing with a virtual instrument from time to time. I rarely use MIDI except to play the synths and instruments.
    My environmental experience so far has been limited to creating and naming audio objects, accessing "hidden" faders and as an alternate to the mix views provided in the global and track mixers.
    I'd prefer free advice but I'm not against paying if it's worth it. I have read the manual but I have a feeling that it will be more helpful once I have a better grasp on the big picture. It's a reference manual more than a how-to.
    My MIDI devices are an Axiom-61 and PreSonus FaderPort.
    Thanks,
    John
    Message was edited by: John Curley

    Apple has what they call "online seminars" available on the main Logic page
    http://www.apple.com/logicpro/
    If you look on the bottom right hand side of the page, you see a link for online seminars. You'll have to go through a regstration process, then you can watch 3 or 4 streaming Quicktime videos of people using different functions in Logic. There's nothing really in depth there, but it does show you a few useful shortcuts and methods.

  • I am new in using Mac operating system, kindly suggest ebooks , videos or audio books to me so that i can learn more about it?

    i am new in using Mac operating system, kindly suggest ebooks, videos or audio books to me so that i can learn more about it.
    any kind of help would be appriciated. i am very eager to learn.how to make ios application? and how to effectively use terminal? where does the basic programming start in Mac? what are the different tools that can help me make an Mac application and ios application.
    -Thank you
    Shailendra (India)

    Apple has got some great guides to start developing in Objective-C, used for programming OS X and iOS apps > http://developer.apple.com/library/mac/#referencelibrary/GettingStarted/RoadMapO SX/chapters/01_Introduction.html

  • How do we learn more about expert in OWB 10g?

    How do we learn more about expert in OWB 10g?
    We are using OWB repository 10.2.0.1.0 and OWB client 10.2.0.1.31. The Oracle version is 10 G (10.2.0.3.0). OWB is installed on Linux.
    I reviewed user guide. It have little info on expert of OWB 10g.
    I like to know/learn more about it.
    Do we have cookbook type of docs?
    How did our forum members learn about owb 10g expert?
    Thanks in advance.
    RI

    Here are various bits and pieces that should get you started, I'll see if there is a cookbook, I know we have an internal one.
    There is an introduction paper here;
    http://www.oracle.com/technology/products/warehouse/pdf/Oracle%20Warehouse%20Builder%2010gR2%20What%20is%20an%20Expert.pdf
    There are examples on the utility exchange, probably a reasonable one that uses the built in components is the data mover expert;
    http://www.oracle.com/technology/products/warehouse/htdocs/Experts/datamover.zip
    There are other interesting examples, such as the create dimension from expert that helps building a dimensional structure and maps. For this one I added simple java procedures for a shuttle dialog and a data entry table that allow different information to be captured.
    See the create dimension from expert here;
    http://www.oracle.com/technology/products/warehouse/htdocs/Experts/datamover.zip
    Another example on accelerating map construction is the SQL to map accelerator which uses the OWB custom dialog to get information, and can be found at the blog post http://blogs.oracle.com/warehousebuilder/newsItems/viewFullItem$198
    You can edit these experts and see the code, the data mover expert has much less code and just glues together pieces of the OWB UI components into a task list that is more specific for the user. The create dimension expert is much more tcl oriented but really simplifies the task at hand.
    Cheers
    David

  • Looking to learn more about Technical Illustration

    Hey.
    If anyone has any information on how I can learn more about Technical Illustration that would be great.  I'm currently looking for work in this field and want to improve my skills in this specialized field.
    Thanks.

    Monika Gause wrote:
    See the tutorials here: http://khulsey.com/
    And then pick your jaw up off the floor and start reading them
    Mr. Hulsey does incredible work.
    Gasp. .. If the next question is, "how would I get started, drawing something like this?", the answer would be "Practice. Practice, and despair."
    That semi-transparent sedan is breathtaking.

  • Cannot use "Learn more about:"

    I have Elements 10 and it seems to be working ok except for this. When I am, for instance, in the Enhance/Adjust lighting/Brightness/contrast portion and I try to get information from the Learn more about: Brightness/contrast, I get the attached message. Must I go through the dreaded de-activation process and risk having to contact customer service? Can't Adobe tell when I am installing the software back on the same computer when there have been no changes to it? Thanks to anyone who can shed some light on this.

    Hmm, that's very odd. You might want to ask in the Installing Adobe Air forum:
    http://forums.adobe.com/community/air/installation
    Perhaps there's something left over from your first installation attempt that needs to be deleted.

  • I would like to learn more about using the Adobe Digital Publishing Suite.

    I would like to learn more about using the Adobe Digital Publishing Suite. I really don't know much about it nor do I know anyone who uses it yet. Is it specifically for creating apps for tablets? What about smart phones? We sometimes produce PDF publications that are posted to our website. Can DPS be used to produce more interactive online publications? What is a .folio application? What platforms are .folio apps used on?

    DPS currently supports iPads, iPhones, and Large and XLarge Android devices. You can start here to get basic information and watch a few videos:
    http://help.adobe.com/en_US/digitalpubsuite/using/WS67cb9e293e2f1f60174dc2eb12f2ca67c28-80 00.html
    If you have an iPad or other mobile device, you can download and play with any of these apps created with DPS tools:
    http://blogs.adobe.com/digitalpublishinggallery

  • Want to learn more about the command line for Mac OS X

    Hi, I'm kind of new here...I've been using my MacBook since last summer, however I want to really get a feel of the command line and would like some recommendations on how to learn more about it.
    Looks like it is based off of BSD, and I've been using Linux for about 10 years now and also have a CompTIA Linux+ cert, however some of the commands aren't the same.
    So, if anyone can post some websites/recommendations that would be great.
    thanks

    Buy any one or more of the many books available at Amazon.com about Unix under OS X. Linux and Unix are related but not the same. Even FreeBSD Unix is not the same as what's implemented under the OS X hood.
    And you will find other good books at PeachPit.com.
    There also is a separate Unix forum here.

  • I cant login to DPS App Builder. Get this error: ERROR This account does not have permission to access App Builder. Learn more about how to resolve this problem.

    I cant login to DPS App Builder. Get this error: ERROR This account does not have permission to access App Builder. Learn more about how to resolve this problem.

    Then you either need to:
    1) Sign up for Creative Cloud so you can build a Single Edition app. Be warned though: this approach will no longer be valid as of May 1st when we retire support for Single Edition in Creative Cloud, and Single Edition apps are only on iPad devices.
    2) Sign up for a full DPS license. You can request pricing information by filling in Adobe | Request for consultation.
    Neil

  • I would like to learn more about "What" Firefox stands for?

    I would like to learn more about "What" Firefox stands for?

    hello hildOrum, a good starting point would be mozilla.org/mission.

  • How do I learn more about Microsoft 1011?

    How do I learn more about Microsoft 1011?

    Here:
    http://www.microsoft.com/hardware/en-us/d/wireless-desktop-elite-keyboard
    http://answers.microsoft.com/en-us/windows/forum/windows_7-hardware/microsoft-de sktop-elite-wireless-keyboard-model/7bc0701d-30ff-45ed-8e09-df6bbea7dc17
    Ciao.

Maybe you are looking for

  • Problems with multiple devices using same apple ID

    I have a Macbook, iPad and iPhone. After doing an IOS update now my devices keep saying I cannot use that same appleid because it's already taken. I cannot find away around this and want to know experience of others

  • Read Only Access to Storage Container

    Is it possible to give Read Only access to a particular storage container without adding someone to Subscription and providing them the access key without anonymous request without going through SAS route

  • Role is not showing up in SUIM transaction

    All Z_PT_TRANS_ALL role was created for all Display access. When I go to SUIM Roles -> By Transaction Assignment. and search for roles this role is not showing up. However, role does have the transaction in S_TCODE. Please advise. From, PT.

  • Can't Create new BLANK Library in iTunes 11

    I haven't seen this mentioned anywhere.  Since iTunes 11,  I can no longer create a new BLANK library; without in seconds it begins to fill up with songs from my main library.  With iTunes 10.7 I could create a new BLANK library and  then fill it wit

  • Help convert HWS to LVM

    Hey, I'm a student at the University of New Hampshire. After talking with an NI Engineer for a while I found out that the equipment here is not capable of converting my hws files to lvm. Could someone with a newer version of LabView or any other meth