Address of a variable: Difference between revisions

From Rosetta Code
Content added Content deleted
Line 3: Line 3:
Demonstrate how to get the address of a variable
Demonstrate how to get the address of a variable
and how to set the address of a variable.
and how to set the address of a variable.

=={{header|360 Assembly}}==
To get the address of a variable, use LA (load address) instead of L (load):
<lang 360asm>
* Get
L R1,I load content of I
LA R3,I load address of I
</lang>
To set a variable J dynamically at the same address of an other variable I, use a DSECT (dummy section):
<lang 360asm>
* Set
USING MYDSECT,R12
LA R12,I set @J=@I
L R2,J now J is at the same location as I

I DS F
MYDSECT DSECT
J DS F
</lang>



=={{header|360 Assembly}}==
=={{header|360 Assembly}}==

Revision as of 07:26, 2 May 2016

Task
Address of a variable
You are encouraged to solve this task according to the task description, using any language you may know.

Basic Data Operation
This is a basic data operation. It represents a fundamental action on a basic data type.

You may see other such operations in the Basic Data Operations category, or:

Integer Operations
Arithmetic | Comparison

Boolean Operations
Bitwise | Logical

String Operations
Concatenation | Interpolation | Comparison | Matching

Memory Operations
Pointers & references | Addresses


Demonstrate how to get the address of a variable and how to set the address of a variable.

360 Assembly

Get The Address

To get the address of a variable, use LA (load address) instead of L (load): <lang 360asm>* Get

        L     R1,I                load content of I
        LA    R3,I                load address of I</lang>

... I DS F

Set The Address

To set a variable dynamically at the same address of an other variable, use a DSECT (dummy section): <lang 360asm>* Set

        USING MYDSECT,R12 
        LA    R12,I               set @J=@I
        L     R2,J                now J is at the same location as I

... I DS F MYDSECT DSECT J DS F</lang>


Ada

Get The Address

<lang ada>The_Address : System.Address; I : Integer; The_Address := I'Address;</lang>

Set The Address

Set the address of a variable to address A100 in hexadecimal <lang ada>I : Integer; for I'Address use 16#A100#;</lang> Set the address of one variable to the address of another variable, creating an overlay. <lang ada>I : Integer; J : Integer; for I'Address use J'Address;</lang>

ALGOL 68

Basically ALGOL 68 refuses to let the programmer access the memory directly. The language does allow "references" any variables. These references are effectively the address a particular variable. But the value of the actual address is not available for printing or any arithmetic. <lang algol68>[4]INT test := (222,444,666,888); REF INT reference := test[3]; REF INT(reference) := reference + 111; print(("test value is now: ",test))</lang>

Output:
test value is now:        +222       +444       +777       +888

The other reason specific addresses are using in languages like C to manipulate devices. For this purpose site are expected to implement channels for their programmers to use. To quote the ALGOL 68 Revised Report: A "channel" corresponds to one or more physical devices (e.g., a card reader, a card punch or a line printer, or even to a set up in nuclear physics the results of which are collected by the computer), or to a filestore maintained by the operating system[1].

To establish a channel with such a device there is a special standard procedure:<lang algol68>PROC establish = (REF FILE file, STRING idf, CHANNEL chan, INT p, l, c) INT: ~</lang> Where the idf string is text describing which device to open, and possibly options. And chan is the actual device type. Standard CHANNELs in ALGOL 68 are stand in channel, stand out channel, and stand back channel. These determine the type of the pre opened stdio FILEs stand in, stand out, and stand back. A site would be expected to implement their own CHANNELs for network connections, database queries and particle accelerators etc.

Argile

Get the address

Works with: Argile version 1.0.0

<lang Argile>use std, array (: array.arg also defines pointer operators :) let var = 42 let ptr = &var (: value of ptr is address of var :) print var (: prints 42 :) (*ptr)++ (: increments value pointed by ptr :) print var (: prints 43 :)</lang>

Set the address

Since we cannot set address of a variable, we use a macro that returns a reference.

Works with: Argile version 1.0.0

<lang Argile>use std, array =:mac:= -> int& { * (0x400000 as int*) } printf "%x\n" mac (: may crash depending on operating system :) </lang>

AutoHotkey

Getting or setting the address of a variable is not supported as a builtin function. However, you can get the address of contents pointed to by the variable structure var <lang AutoHotkey>msgbox % &var</lang>

Axe

Axe supports getting the address of a variable using the degree symbol: <lang axe>°A→B .B now contains the address of A</lang>

Axe does not support setting the address of a variable directly. However, it does support setting the value of a variable and then dereferencing it: <lang axe>1234→A 1→{A}</lang> This should usually be avoided because TI-OS does not use virtual memory. Writing to arbitrary memory locations can affect the stability of the operating system.

BASIC

Many BASICs, especially older flavors like QuickBASIC, lack the ability to set a variable's address (and indeed, they pretty much all lack the ability to work with pointers in any fashion). <lang qbasic>'get a variable's address: DIM x AS INTEGER, y AS LONG y = VARPTR(x)

'can't set the address, but can access a given memory location... 1 byte at a time DIM z AS INTEGER z = PEEK(y) z = z + (PEEK(y) * 256)</lang>

BBC BASIC

The original BBC BASIC doesn't provide an address-of operator, but BBC BASIC for Windows does: <lang bbcbasic>REM get a variable's address: y% = ^x%

REM can't set a variable's address, but can access a given memory location (4 bytes): x% = !y%</lang>

With BBC BASIC on other platforms the address of a variable can be found by calling a short piece of machine code, see BeebWiki.

C#

Use of pointers in C# is restricted to unsafe sections of code, which is enabled in Microsoft's C# compiler with the commandline parameter /unsafe or in Mono's C# compiler with -unsafe (or --unsafe in older versions).

Get the address

Note that void* is a "pure" address which doesn't carry the type information anymore. If you need the type information (e.g. to recover the variable itself in a type safe manner), use a pointer to the appropriate type instead; in this case int*.

<lang csharp>unsafe {

 int i = 5;
 void* address_of_i = &i;

}</lang>

C / C++

Works with: gcc
Works with: g++

Get the address

Note that void* is a "pure" address which doesn't carry the type information anymore. If you need the type information (e.g. to recover the variable itself in a type safe manner), use a pointer to the appropriate type instead; in this case int*. <lang cpp>int i; void* address_of_i = &i;</lang>

Set the address

While C++ doesn't directly support putting a variable at a given address, the same effect can be achieved by creating a reference to that address: <lang cpp>int& i = *(int*)0xA100;</lang>

Overlaying of variables is done with anonymous unions; however at global/namespace scope such variables have to be static (i.e. local to the current file): <lang cpp>static union {

 int i;
 int j;

};</lang> C++ only: An alternative (and cleaner) solution is to use references: <lang cpp>int i; int& j = i;</lang> Note that in this case, the variables can be non-static.

COBOL

Pointers were added in COBOL 2002.

Get Address

<lang cobol>data division. working-storage section. 01 ptr usage pointer. 01 var pic x(64).

procedure division. set ptr to address of var.</lang>

Set Address

Sets the address of a variable using the BASED clause. There are other methods, in particular LINKAGE SECTION variables. <lang cobol> OCOBOL*> Rosetta Code set address example

     *> tectonics: cobc -x setaddr.cob && ./setaddr 
      program-id. setaddr.
      data division.
      working-storage section.
      01 prealloc  pic x(8) value 'somedata'.
      01 var       pic x(8) based.
      procedure division.
      set address of var to address of prealloc
      display var end-display
      goback.
      end program setaddr.</lang>

Common Lisp

Simulated Address of Variable

Common Lisp has no means to take a simple address reference to a place (the Lisp term for any one of many types of assignable storage locations). For instance, to access the slot of a structure, we need the structure itself (which is essentially a pointer) and a symbol denoting the slot name. To access an array, we need that array object, and an index. To access a local variable, we need the closure object, which is only accessible to code within the lexical scope, which is a long-winded way of saying, we can only access a variable via an expression which is in the lexical scope of the variable.

Yet, thanks to Lisp macros and lexical closures, we can create reference values which behave like address of places. A tiny module for doing this is found in Lisppaste #71952 (now it's available here), required by the following example:

<lang lisp>;;; Demonstration of references by swapping two variables using a function rather than a macro

Needs http://paste.lisp.org/display/71952

(defun swap (ref-left ref-right)

 ;; without with-refs we would have to write this:
 ;; (psetf (deref ref-left) (deref ref-right)
 ;;        (deref ref-right) (deref ref-left))
 (with-refs ((l ref-left) (r ref-right))
   (psetf l r r l)))

(defvar *x* 42) (defvar *y* 0)

(swap (ref *x*) (ref *y*))

*y* -> 42
*x* -> 0</lang>

These references are completely safe to use. There is no way that a place can disappear, leaving a reference dangling, because if a reference is a live object, it prevents the object which contains the referenced place from becoming garbage. Also note that if two references are taken to the same memory location, they are two distinct objects. A function could be provided to test two references for referential equality (do they point to the same object).

Varible-Like Moniker for External Location

Works with: CLISP
Works with: Linux
Works with: Cygwin

What does it mean to "set the address of a variable?" One interpretation of this task is: rather than let the programming language compiler or run-time allocate a named storage location in its usual ways, force the allocation of a variable at some particular memory location, such as a hardware register, or a variable in a foreign library. Lisp implementations have foreign function interfaces for doing this sort of thing.

Here is an example specific to CLISP running on either Linux or Cygwin. It creates a Lisp errno variable which is located in the C Library's errno. The C Library's errno is actually thread-specific, whose location is retrieved by calling a hidden function.

We wrap this function with a Lisp foreign call which is properly annotated as returning a C pointer to int. When we call this function, we get an object that behaves like a reference to that location. All we need then is a macro which looks like a storage location.

<lang lisp>(use-package :ffi)

(defmacro def-libc-call-out (name &rest args)

 `(def-call-out ,name
    (:language :stdc)
    #-cygwin(:library "libc.so.6")
    #+cygwin (:library "cygwin1.dll")
    ,@args))

(progn

 (def-libc-call-out errno-location
   #-cygwin (:name "__errno_location")
   #+cygwin (:name "__errno")
   (:arguments)
   (:return-type (c-pointer int)))
 (defun get-errno ()
   (let ((loc (errno-location)))
     (foreign-value loc)))
 (defun set-errno (value)
   (let ((loc (errno-location)))
     (setf (foreign-value loc) value)))
 (defsetf get-errno set-errno)
 (define-symbol-macro errno (get-errno)))</lang>

Test:

[1]> (setf errno 42)
42
[2]> errno
0   ;; Oops! the REPL itself executed a bunch of code which cleared errno
[3]> (progn (delete-file "nonexistent") errno)
2   ;; Aha! 2 is ENOENT: No such file or directory

Creative Basic

<lang Creative Basic>

Get

To get the address of a variable without using the Windows API:

DEF X:INT DEF pPointer:POINTER pPointer=X


To get the address of a variable using the Windows API Lstrcpy function called in Creative Basic: (This may give users of another language without a native way to get the address of a variable to work around that problem.)

DEF Win:WINDOW DEF Close:CHAR DEF ScreenSizeX,ScreenSizeY,Col:INT

'***Map Function*** DECLARE "Kernel32",Lstrcpy(P1:POINTER,P2:POINTER),INT 'The pointers replace the VB3 variable type of Any.

'Note: This is translated from VB3 or earlier code, and "Ptr" is *not* a Creative Basic pointer. DEF Ptr:INT DEF X1:INT DEF X2:STRING

X1=123

'***Call function*** Ptr=Lstrcpy(X1,X1)

GETSCREENSIZE(ScreenSizeX,ScreenSizeY)

WINDOW Win,0,0,ScreenSizeX,ScreenSizeY,@MINBOX|@MAXBOX|@SIZE|@MAXIMIZED,0,"Skel Win",MainHandler

'***Display address*** PRINT Win, "The address of x1 is: " + Hex$(Ptr)

     X2="X2"

WAITUNTIL Close=1

CLOSEWINDOW Win

END

SUB MainHandler

SELECT @CLASS

CASE @IDCLOSEWINDOW

Close=1

ENDSELECT

RETURN

Note: The Windows Dev Center (http://msdn.microsoft.com/en-us/library/windows/desktop/ms647490%28v=vs.85%29.aspx) says improper use of the Lstrcpy function may compromise security. A person is advised to see the Windows Dev site before using the Lstrcopy function.

Set

It appears to the author the closest one can come to setting the address of a variable is to set which bytes will be used to store a variable in a reserved block of memory:

DEF pMem as POINTER pMem = NEW(CHAR,1000) : 'Get 1000 bytes to play with

  1. <STRING>pMem = "Copy a string into memory"

pMem += 100

  1. <UINT>pMem = 34234: 'Use bytes 100-103 to store a UINT

DELETE pMem </lang>

Component Pascal

BlackBox Component Builder <lang oberon2> MODULE AddressVar; IMPORT SYSTEM,StdLog;

VAR x: INTEGER;

PROCEDURE Do*; BEGIN StdLog.String("ADR(x):> ");StdLog.IntForm(SYSTEM.ADR(x),StdLog.hexadecimal,8,'0',TRUE);StdLog.Ln END Do;

BEGIN x := 10; END AddressVar. </lang> Execute: ^Q AddressVar.Do

Output:
ADR(x):> 653700D8H

D

Take the address of a variable: <lang d>int i; int* ip = &i;</lang>

Using a numeric value: <lang d>int* ip = cast(int*)0xdeadf00d;</lang>

Locating a "regular" variable at a specific address is not possible.

The closest thing is passing a dereferenced pointer to a reference parameter.

<lang d>void test(ref int i) {

   writefln(&i);

}

void main() {

   test(* (cast(int*)0xdeadf00d) );

}</lang>

Delphi

Turbo/Borland Pascal and Delphi (Object Pascal) support the @ ( address of ) operator and the var : [type] absolute declaration.

To get the address of any variable, structure, procedure or function use the @ operator.

 var
   Int : integer ;
   p   : ^integer ;
 begin
   P := @int ;
   writeln(p^);
 end;

A variable can be declared as absolute ie: to reside at a specific address.

 Var
   CrtMode : integer absolute $0040 ;
   Str     : string[100] ;
   StrLen  : byte absolute Str ;


ERRE

ERRE hasn't explicit pointers, but only a function that gets the address of a variable <lang> ........ A%=100 ADDR=VARPTR(A%) ....... </lang> ADDR contains the value of the address of variable A (from 0 to 65535 because every ERRE module has a 64K address space). ERRE data types is 2 bytes-long for integer, 4 (5 with C-64) for reals and 8 for double-real variables. Using this address you can modify the variable's value without using an assignment statement: <lang> PROGRAM POINTER BEGIN

  A%=100
  ADDR=VARPTR(A%)
  PRINT(A%)       ! prints 100
  POKE(ADDR,200)
  PRINT(A%)       ! prints 200

END PROGRAM </lang> Note: With C-64 substitute POKE(ADDR,200) with POKE(ADDR+3,200).

FBSL

Unlike in other BASICs, pointers are readily available in FBSL in several ways although C-style pointer arithmetics is not supported.

1. A simple Variant variable may be dereferenced to point to any other FBSL entity from simple variables through arrays to class instances and COM objects with a ReferenceOf operator, e.g.

   ReferenceOf a = b

whereby a is set to refer to the variable b.

2. Non-function entities' pointers can be both retrieved and set using a PointerOf operator which also has a shorthand alias @, e.g.

   @a = @b

whereby a is set to refer to the variable b. Assignment through the PointerOf operator also accepts integer literals to set the variable's absolute address to.

3. Function pointers can be both retrieved and set using an AddressOf operator as in the following sample script. Assignment via AddressOf also accepts integer literals to set a function pointer to an absolute address.

   #APPTYPE CONSOLE
   
   SUB Foo()
       PRINT "foo"
   END SUB
   
   SUB Bar()
       PRINT "bar"
   END SUB
   
   ADDRESSOF Foo = ADDRESSOF Bar
   
   Foo() // prints "bar" to the console
   
   PAUSE

4. Values at an absolute address or address read by a PointerOf operator plus a byte offset can be retrieved or set using the Peek()/Poke() and GetMem()/SetMem() functions.

Forth

Variables and created memory blocks return their address when referenced. The "fetch" operator @ could also be pronounced "dereference".

variable foo
foo .  \ some large number, an address
8 foo !
foo @ .  \ 8

You can define a constant or value with an address, which then acts like a variable. This can be used to refer to fixed addresses (such as I/O ports), graphics buffers, or allocated memory.

$3F8 constant LPT1:
8 LPT1: !
100 cells allocate throw value buffer
42 buffer 20 cells + !

Fortran

Works with: Fortran version 90 and later

<lang fortran>program test_loc

 implicit none
 integer :: i
 real :: r
 i = loc (r)
 write (*, '(i0)') i

end program test_loc</lang> Note: loc is a common extension that is implemented by e.g. the Intel Fortran Compiler, G95 and gfortran.

Go

Go has pointers. Just like in C, you can "take the address" of an addressable value by using the & operator, and access the value pointed to by a pointer using the * operator.

Unlike in C, pointers are not readily convertible to integers and there is no direct pointer arithmetic. You may print out the address of a pointer, either using the Print function on the pointer, or using the %p format specifier in formatted output (just like in C).

When rarely required, you can convert a pointer to an integer using the unsafe package.

It is not possible in Go to set the address of a variable, however you can assign an arbitrary value to a pointer and use/deference that pointer.

The following demonstrates getting the address of a variable and storing/printing it various ways. It also demonstrates accessing an arbitrary memory location (here the known address of a float) as an integer. <lang go>package main

import ( "fmt" "unsafe" )

func main() { myVar := 3.14 myPointer := &myVar fmt.Println("Address:", myPointer, &myVar) fmt.Printf("Address: %p %p\n", myPointer, &myVar)

var addr64 int64 var addr32 int32 ptr := unsafe.Pointer(myPointer) if unsafe.Sizeof(ptr) <= unsafe.Sizeof(addr64) { addr64 = int64(uintptr(ptr)) fmt.Printf("Pointer stored in int64: %#016x\n", addr64) } if unsafe.Sizeof(ptr) <= unsafe.Sizeof(addr32) { // Only runs on architectures where a pointer is <= 32 bits addr32 = int32(uintptr(ptr)) fmt.Printf("Pointer stored in int32: %#08x\n", addr32) } addr := uintptr(ptr) fmt.Printf("Pointer stored in uintptr: %#08x\n", addr)

fmt.Println("value as float:", myVar) i := (*int32)(unsafe.Pointer(&myVar)) fmt.Printf("value as int32: %#08x\n", *i) }</lang>

Output:

On a 32 bit architecture:

Address: 0x3826c020 0x3826c020
Address: 0x3826c020 0x3826c020
Pointer stored in   int64: 0x000000003826c020
Pointer stored in   int32: 0x3826c020
Pointer stored in uintptr: 0x3826c020
value as float: 3.14
value as int32: 0x51eb851f

On a 64 bit architecture:

Address: 0xc208000170 0xc208000170
Address: 0xc208000170 0xc208000170
Pointer stored in   int64: 0x000000c208000170
Pointer stored in uintptr: 0xc208000170
value as float: 3.14
value as int32: 0x51eb851f

IWBASIC

<lang IWBASIC>

Get

There are at least three ways to get the address of a variable in IWBASIC. The first is to use the address of operator:

DEF X:INT PRINT &X 'This will print in the console window (after OPENCONSOLE is issued.) 'To Print in an open window the appropriate Window variable is specified, e.g., PRINT Win,&X.

The second is to use a pointer:

DEF X:INT DEF pPointer:POINTER pPointer=X

The third is to use the Windows API function Lstrcpy. That is done in the same way as the Creative Basic example; however, the function would be declared as follows: DECLARE IMPORT,Lstrcpy(P1:POINTER,P2:POINTER),INT.

Set

It appears to the author that the closest one can come to being able to assign an address to a variable is to set which bytes will be used to store a variable in a block of reserved memory:

DEF pMem as POINTER pMem = NEW(CHAR,1000) : 'Get 1000 bytes to play with

  1. <STRING>pMem = "Copy a string into memory"

pMem += 100

  1. <UINT>pMem = 34234: 'Use bytes 100-103 to store a UINT

DELETE pMem </lang>

J

J hides the details of pointers and memory allocation from the programmer, so it is rarely, if ever, necessary to do this. However, for those times when there is no better substitute, J provides access to these low-level details:

<lang> var =: 52 NB. Any variable (including data, functions, operators etc)

  var_addr =: 15!:6<'var'       NB.  Get address
  new_var  =: 15!:7 var_addr    NB.  Set address</lang>

Java

There is no way to access addresses of variables in Java. However, the default hashCode() method defined in the Object class, "is typically implemented by converting the internal address of the object into an integer". Therefore, in some Java implementations at least, the hash code returned by Object.hashCode() reflects at least part of the address of an object. For objects whose classes have overridden the hashCode() method, you can still access the original hash code through the System.identityHashCode() function.

Julia

Julia provides a variety of ways to work with and manipulate raw address pointers (via the built-in Ptr type), which are mostly used in practice for calling C library functions.

To get the memory address of a Julia object, one can use pointer_from_objref(object), and the reverse is accomplished by unsafe_pointer_to_objref(ptr): <lang julia>julia> x = 3 julia> ptr = pointer_from_objref(x) Ptr{Void} @0x000000010282e4a0 julia> unsafe_pointer_to_objref(ptr) 3</lang> The latter is "unsafe" because it only works if ptr refers to a valid heap-allocated "boxed" Julia object, which can only be safely allocated by Julia itself.

Another common use of pointers is for arrays of values, which are typically passed in low-level C-like libraries via pointers to contiguous sets of values in memory. This is accomplished in Julia by the pointer(A) function, which returns a pointer to the data stored in a high-level Julia array A. Given a pointer p to values of a given type, the i-th value (numbered starting at 1 for the value pointed to by p) can be read or written by the low-level unsafe_load(p, i) and unsafe_store!(p, val, i) functions, or it can be converted back to a high-level Julia array type by the pointer_to_array(p, dimensions) function:<lang julia>julia> A = [1, 2.3, 4] 3-element Array{Float64,1}: 1.0 2.3 4.0 julia> p = pointer(A) Ptr{Float64} @0x0000000113f70d60 julia> unsafe_load(p, 3) 4.0 julia> unsafe_store!(p, 3.14159, 3) julia> A 3-element Array{Float64,1}: 1.0 2.3 3.14149 julia> pointer_to_array(p, (3,)) 3-element Array{Float64,1}: 1.0 2.3 3.14149</lang> Finally, an arbitrary integer can be converted to a pointer type with convert, which allows an arbitrary address to be converted into and viewed as an array of an arbitrary type and read or written (although this can easily result in a crash if an invalid address is used). In the following example, we create a "new" length-two array B at an address offset by 8 bytes from the address of the data in A above, which will make it point to the second element of A:<lang julia>julia> julia> q = convert(Ptr{Float64}, 0x0000000113f70d68) Ptr{Float64} @0x0000000113f70d68 julia> B = pointer_to_array(q, (2,)) 2-element Array{Float64,1}: 2.3 3.14149</lang>

Modula-2

Get Address

<lang modula2>MODULE GetAddress;

FROM SYSTEM IMPORT ADR; FROM InOut IMPORT WriteInt, WriteLn;

VAR var : INTEGER;

       adr : LONGINT;

BEGIN

   adr := ADR(var);    (*get the address*)
   WriteInt(adr, 0);
   WriteLn;

END GetAddress.</lang>

Set Address

<lang modula2>MODULE SetAddress;

CONST adress = 134664460;

VAR var [adress] : INTEGER;

BEGIN

   (*do nothing*)

END SetAddress.</lang>

NewLISP

Get Address

<lang NewLISP> (set 'a '(1 2 3)) (address a) </lang>

Nim

<lang nim>var x = 12 var xptr = addr(x) # Get address of variable echo cast[int](xptr) # and print it xptr = cast[ptr int](0xFFFE) # Set the address</lang>

Oberon-2

Get Address

VAR a: LONGINT;
VAR b: INTEGER;

b := 10;
a := SYSTEM.ADR(b); (* Sets variable a to the address of variable b *)

Set Address

SYSTEM.PUT(a, b); (* Sets the address of b to the address of a *)

OCaml

OCaml is a high-level programming language, and thus does not expose the addresses of variables to the programmer.

However, it is kind of possible to get the address of the structure pointed to by a reference type. At runtime, every value in OCaml is a pointer to a "block" structure (i.e. boxed) except for int (and things that can fit inside an int, like char, bool, None, datatypes with all no-arg constructors, etc.) which is a direct value (unboxed). For boxed types, it is possible to get this address by some tricky hacks.

An OCaml value is distinguished between an unboxed integer and a boxed type by the last (least significant) bit. If the bit is set (1), then the value is an integer, and the rest of the bits are the bits of the integer, shifted one bit to the left (that's why int in OCaml can only represent 31 bits in 32-bit, and 63 bits in 64-bit). If the last bit is cleared (0), then the value is a pointer, and all the bits (including the last one) form the address.

To get the address, we re-interpret the boxed value as an integer; however, this will get the address divided by 2, since the integer only uses the upper 31 (or 63) bits. Therefore, we need to shift this number left by one to get the real address. However, int cannot hold all the bits of the address, so if we shift we will lose a bit, so we use the nativeint type to represent it instead:

<lang ocaml>let address_of (x:'a) : nativeint =

 if Obj.is_block (Obj.repr x) then
   Nativeint.shift_left (Nativeint.of_int (Obj.magic x)) 1 (* magic *)
 else
   invalid_arg "Can only find address of boxed values.";;

let () =

 let a = 3.14 in
 Printf.printf "%nx\n" (address_of a);;
 let b = ref 42 in
 Printf.printf "%nx\n" (address_of b);;
 let c = 17 in
 Printf.printf "%nx\n" (address_of c);; (* error, because int is unboxed *)</lang>

ooRexx

ooRexx is a high-level programming language, and thus does not expose the addresses of variables to the programmer. Variables can be accessed by name using the VAR(), SYMBOL(), and VALUE() built-in functions.

OxygenBasic


'GETTING ADDRESS OF VARIABLE

int a=1,b=2,c=3
print "Adrress of b: " @b


'SETTING ADDRESS OF INDIRECT (BYREF) VARIABLE

int *aa,*bb,*cc

@bb=@b 'setting address of bb to address of b

print "Value of bb: " bb 'result: 2

Panoramic

<lang Panoramic>

Get

adr(variable)

Example:

dim a print adr(a)

Set

Whether Panoramic is able to set the value of a variable may depend on what is meant by that. Panoramic implements the poke command to set a byte from a value of 0 to 255 (inclusive). Panoramic also implements the peek command to get the value of a byte, so it is possible to the following:

(A) dim a rem a variable with no post-fix is a real. poke adr(a),57 rem the value of a variable being set by setting an address, the address of a in this instance.

(B) dim a%,b% rem % means integer. b%=57 poke adr(a%),b% rem b% being assigned to the address of a%, in this instance. rem it is even possible to free b% free b% print a%

(C) dim a,b b=57 poke adr(a),b b=peek(adr(a)) print b rem the address of b being, in effect, set to the address of a, the address of a, in this instance.

rem Observations and further insight welcome.

Note: An attempt to poke a real or an integer (Panoramic's only numeric types) value of less than 0 or of more than 255 will cause an error. </lang>

PARI/GP

In GP you can sent the address to built-in commands like issquare <lang parigp>issquare(n, &m)</lang> but you cannot directly compute with it. You can view the address of a variable and other debugging information with the

\x

command.

In PARI you can use standard C commands.

Pascal

See Delphi

Perl

To get the address, get the reference to a variable, and either stringify it, or use Scalar::Util's refaddr() to get just the address. Also see Devel::Peek. <lang perl>use Scalar::Util qw(refaddr); print refaddr(\my $v), "\n"; # 135691508</lang> Use Devel::Pointer::PP if you want to dereference a certain address in memory.

Changing the address of a variable is not easily possible, but see perlapi. Wanting to go against the automatic memory management is a sign that this is only used to hack around the deficiencies of dafter languages. I can imagine address munging is commonly used to make variable aliasing possible, but Perl already has a higher level syntax for that.

Simple reference (address) manipulation. <lang perl>my $a = 12; my $b = \$a; # get reference $$b = $$b + 30; # access referenced value print $a; # prints 42</lang>

Example how to make variable overlay. <lang perl>my $a = 12; our $b; # you can overlay only global variables (this line is only for strictness)

  • b = \$a;

print $b; # prints 12 $b++; print $a; # prints 13</lang>

Perl 6

Works with: Rakudo version 2015.12

<lang perl6>my $x; say $x.WHERE;

my $y := $x; # alias say $y.WHERE; # same address as $x

say "Same variable" if $y =:= $x; $x = 42; say $y; # 42 </lang>

Output:
7857931379550584425

How you set the address of a variable (or any other object) is outside the purview of the Perl 6 language, but Perl 6 supports pluggable object representations, and any given representation scheme could conceivably allow an existing address to be treated as an object candidate where that makes sense. Memory-mapped structs are not unreasonable and are likely to be supported on VMs that allow it.

Phix

Phix does not natively support pointers, but there are methods to do whatever you need.
You cannot set the address of a variable, but you can save it and use that to modify things.
Things get more complicated for floats/strings/sequences, particularly wrt reference counts, but there are examples aplently, for pretty much everything, in the builtins/VM sources. Since all hll variables are dword-aligned or better, a shr 2 loses no information and the result can be safely stored in an integer, avoiding some nasty int/float conversions for anything above #3FFFFFFF (on 32 bit, add another 8Fs on 64 bit). Obviously extreme caution must be exercised, in the example below if you save the address of V which is local to the address() procedure, and then exit said, you have a pointer to memory that will be re-used for something completely different almost immediately. Example is 32 and 64 bit compatible, which at this level needs twice the code, however the compiler only omits the appropriate binary for the currently selected target architecture. You can also use allocate/free with peek/poke to obtain similar effects. <lang Phix>procedure address() object V integer addr4 -- stored /4 (assuming dword aligned, which it will be)

  1. ilASM{
   [32]
       lea eax,[V]
       shr eax,2
       mov [addr4],eax
   [64]
       lea rax,[V]
       shr rax,2
       mov [addr4],rax
   []
     }
   if machine_bits()=32 then
       poke4(addr4*4,123)
   elsif machine_bits()=64 then
       poke8(addr4*4,123)
   end if
   ?V
   if getc(0) then end if

end procedure

address()</lang>

Output:
123

PicoLisp

The PicoLisp function 'adr' returns the address of a variable. A variable may be either a symbol or a cons pair in PicoLisp.

The returned address is a number representing an encoded pointer. For symbols, it is a negative number, and for cons pairs a positive number. The same function 'adr' can then be used to convert that pointer back to the original object. <lang PicoLisp>: (setq X 7) -> 7

(adr 'X)

-> -2985527269106

(val (adr -2985527269106))

-> 7

(set (adr -2985527269106) '(a b c))

-> (a b c)

X

-> (a b c)</lang>

PL/I

<lang PL/I> declare p pointer; k = addr(b); /* Obtain address of variable, stored in integer variable k */ p = addr(q); /* assigns address to pointer variable p. */ </lang>

PowerBASIC

<lang powerbasic>'get a variable's address: DIM x AS INTEGER, y AS LONG y = VARPTR(x)

'can't set the address of a single variable, but can access memory locations DIM z AS INTEGER z = PEEK(INTEGER, y)

'or can do it one byte at a time DIM zz(1) AS BYTE zz(0) = PEEK(BYTE, y) zz(1) = PEEK(BYTE, y + 1) '(MAK creates an INTEGER, LONG, or QUAD out of the next smaller type) z = MAK(INTEGER, zz(0), zz(1))

'*can* set the address of an array DIM zzz(1) AS BYTE AT y 'zzz(0) = low byte of x, zzz(1) = high byte of x</lang>

PureBasic

Get the address of a variable using the '@' operator. <lang PureBasic>a.i = 5 MessageRequester("Address",Str(@a))</lang>


Set the address of a structured pointer. The pointer can be dereferenced to interact with it's data. Ensure that there is access to the memory address that is assigned to the pointer (i.e. part of allocated memory). <lang PureBasic>a.i = 5

  • b.Integer = @a ;set *b equal to the address of variable a
  • c.Integer = $A100 ;set *c to point at memory location $A100 (in hex)


MessageRequester("Address",Str(*b)) ;display the address being pointed at by *b MessageRequester("Value",Str(*b\i)) ;de-reference the pointer *b to display the data being pointed at</lang>

Python

Python traditionally doesn't support low-level operations on memory addresses, except in the limited sense that one can use the mmap module where it's available, and manipulate offsets into memory map objects...including serializing other objects into and out of the memory mapping. New versions of Python support a ctypes module which permits some low level address operations on C-type objects (see C-types Reference for details).

The Python id() function returns a unique ID for any object. This just happens to be implemented as the base address of the object in C Python[2]; but that is not guaranteed by the semantics of the language and should not be considered a standard, nor used as such. But for comparison purposes the ID can be used as an address, since different extant objects will have different IDs.

<lang python>foo = object() # Create (instantiate) an empty object address = id(foo)</lang>

In addition some folks have written binary Python modules which implement "peek" and "poke" operations, but these are non-standard.

Racket

<lang racket>#lang racket

(require ffi/unsafe)

(define (madness v) ; i'm so sorry

  (cast v _racket _gcpointer))</lang>

To test that it is doing "sane" things, you can retrieve the value of the C short located at the pointer produced. Racket objects start with a 2-byte tag indicating their type. These calls should all produce fairly small numbers: the Racket source I'm looking at uses only the first 259 tag values. Small fixnums are stored directly in tagged pointers, so attempting this dereferencing on the pointer madness gives you from a fixnum will most likely segfault your process.

<lang racket> (ptr-ref (madness +) _short) (ptr-ref (madness (/ 4 3)) _short) (ptr-ref (madness 3.2) _short) (ptr-ref (madness (sqrt -2)) _short) (ptr-ref (madness #\a) _short) (ptr-ref (madness 'foo) _short) </lang>

RapidQ

<lang vb> Dim TheAddress as long Dim SecVar as byte Dim MyVar as byte

   MyVar = 10

'Get the address of MyVar TheAddress = varptr(MyVar)

'Set a new value on the address MEMSET(TheAddress, 102, SizeOf(byte))

'Myvar is now = 102 showmessage "MyVar = " + str$(MyVar)

'...or copy from one address to another using: MEMCPY(VarPtr(SecVar), TheAddress, SizeOf(byte))

'SecVar is now also = 102 showmessage "SecVar = " + str$(SecVar) </lang>

Retro

Retro is only able to directly access memory as 32-bit values within a linear address space.

Get The Address

<lang Retro>variable a &a</lang>

Set The Address

Create variable b and point it to address 100 <lang Retro>variable b 100 @last !d->xt</lang>

Byte Addressing

Retro includes a standard library allowing for creation and access of byte-level data. This is done by creating a pool, which the library functions can then access individual bytes from. The pool has a physical address, which can be set or read, and virtual addresses (starting with zero, and increasing linearly) which are used by the library functions.

To read the address of the currently active pool:

<lang Retro>needs bad' ^bad'pool @</lang>

Or to set the pool to a specific physical location such as address 100:

<lang Retro>100 ^bad'pool !</lang>

REXX

REXX has no easy way of getting the address of variables within the langage itself, but since each
REXX variable can be accessed by name and its name passed to (say) subroutines [PROCEDUREs],
with the use of the VALUE and SYMBOL built-in functions (BIFs), it's possible to determine
the state of any variable (defined or not defined, its value, length of the variable's value).

It is possible to use the BIF (shown below)  (at least, in the original REXX) <lang rexx>zzz = storage(xxx)</lang> (but only in some REXX interpreters)   to access the internal REXX pool of variables, but it
would depend on the (internal) REXX internal structure(s) and almost likely be not portable nor
useable across releases of REXX or the operating system.   It would be necessary to follow a
pretty complex chain of pointers to just find the REXX pool of variables and the internal structure
may be pretty complicated and somewhat obscure.   Going down this path is not for the faint of
heart.

Ruby

You can't access the address of a "variable" in Ruby. However, it may be possible to get the address of an object.

The Ruby object_id method returns an object ID that is unique among active objects. It turns out that for the official Ruby implementation, the object ID is based on the address. For non-immediate objects (i.e. anything other than a Fixnum, Symbol, true, false, or nil), the address can be obtained by shifting the object ID one to the left. For more information, see the source code for the object_id method:[3].

For classes that do not override the to_s method, the to_s method also shows the address.

<lang ruby>>foo = Object.new # => #<Object:0x10ae32000> >id = foo.object_id # => 2238812160 >"%x" % (id << 1) # => "10ae32000" </lang>

Rust

It is not possible to change the memory address of an existing variable in Rust.

Get the memory address of a variable: <lang rust>let var = 1; println!("address of var: {:p}", &var);</lang>

Get the value at a certain memory address: <lang rust>let address: usize = 0x7ffc8f303130; unsafe {

   let val = *(address as *const usize);
   println!("value at {}: {:?}", address, val);

}</lang>

Set the value at a certain memory address: <lang rust>unsafe {

   *(0x7ffc8f303130 as *mut usize) = 1;

}</lang>

Scala

There is no way to access addresses in Scala. It's governed by the Memory Management of the JVM controlling or knowing the addresses makes absolutely no sense in Scala.

Sidef

<lang ruby>var n = 42; say Sys.refaddr(\n); # prints the address of the variable say Sys.refaddr(n); # prints the address of the object at which the variable points to</lang>

Output:
42823224
37867184

Smalltalk

This task does not really make sense in Smalltalk: for one, all we could ask for is the address of an object, not a variable, which is a binding of a name to a value in a lexical scoping (similar to Scheme, Common Lisp and other managed languages). Second, the underlying memory management (garbage collector) is usually free to move objects around, and most implementations do so when objects are tenured or memory areas are defragmented (also similar). So its usefulness is limited to VM developers and debuggers ;-)

You asked for it, and here it is:

Works with: Smalltalk/X

<lang smalltalk>|p| p := Point x:10 y:20. ObjectMemory addressOf:p. ObjectMemory collectGarbage. ObjectMemory addressOf:p "may return another value"</lang> to deal with non-Smalltalk objects, all Smalltalks provide libraries to pass-in and out parameters to foreign function calls (FFI). The underlying memory block will not be moved by the garbage collector and the address can be passed to external (eg. C, C++, asm) functions. For those, we can allocate a block of memory and fiddle around with its "address":

Works with: Smalltalk/X

<lang smalltalk>|ptr| ptr := ExternalBytes new:10. ptr address. ptr byteAt:1 put: 16rFF.</lang>

However, there are "reference holders", similar to box-objects in scheme/lisp. In Smalltalk these are called "ValueHolder" and are heavily used in UI frameworks. Usually, they are used with the observer pattern as shown in the following example: <lang>|holder| holder := ValueHolder with:123. holder onChangeSend:#someChange to:someone. holder value: 234 </lang>

Swift

<lang swift>class MyClass { }

func printPointer<T>(ptr: UnsafePointer<T>) {

 println(ptr)

}

func test() {

 var x = 42
 var y = 3.14
 var z = "foo"
 var obj = MyClass()
 
 // Use a pointer to a variable on the stack and print its address
 withUnsafePointer(&x) { ptr in println(ptr) }
 withUnsafePointer(&y) { ptr in println(ptr) }
 withUnsafePointer(&z) { ptr in println(ptr) }
 withUnsafePointer(&obj) { ptr in println(ptr) }
 
 // Alternately:
 printPointer(&x)
 printPointer(&y)
 printPointer(&z)
 printPointer(&obj)
 
 // Printing the address of an object that an object reference points to
 println(unsafeAddressOf(obj))

}

test()</lang>

Output:
0x00007fff5fbff7f8
0x00007fff5fbff7f0
0x00007fff5fbff7d8
0x00007fff5fbff7d0
0x00007fff5fbff7f8
0x00007fff5fbff7f0
0x00007fff5fbff7d8
0x00007fff5fbff7d0
0x00000001003a0000

Tcl

It is highly unusual to want to directly manipulate the address of a variable in Tcl, as it is a thoroughly unsafe operation. Indeed, Tcl does not expose any mechanism to do so at the script level. However, Tcl does contain a C-level API function, Tcl_LinkVar, to arrange for a variable's value to always reflect the contents of a particular address in memory. (See Machine Address for an example of how to do that.)

However, that's not the only way of doing it. You can also use the critcl library to put C code directly inside a Tcl script and so work with addresses directly that way.

Library: critcl

<lang tcl>package require critcl

  1. This code assumes an ILP32 architecture, like classic x86 or VAX.

critcl::cproc peek {int addr} int {

   union {
      int i;
      int *a;
   } u;
   u.i = addr;
   return *u.a;

} critcl::cproc poke {int addr int value} void {

   union {
       int i;
       int *a;
   } u;
   u.i = addr;
   *u.a = value;

} package provide poker 1.0</lang> Demonstrating: <lang tcl>package require poker

  1. Increment a memory location; this will probably crash if you try for real.
  2. We don't define how to get a good address, but it's not usually a problem
  3. for embedded programming...

set where 0x12340 poke $where [expr {[peek $where] + 1}]</lang> Have great care with this sort of code; the damage you can do by writing to random locations is considerable and being able to read from anywhere could allow information to flow to otherwise unauthorized programs.

Toka

Get the Address

The default behaviour of a data element in Toka is to return its address. This makes obtaining the address trivial:

variable foo
foo .

Set the Address

You can manually assign a name to any memory address (or other number), but you should make sure it's part of allocated memory first.

 hex abcdef is-data foo
 foo .

Visual Basic .NET

Visual Basic uses managed memory that can be moved around at any time. If a memory address for a variable is needed, the address is created first and then its contents copied.

Get the Address

Allocates a stable address in unmanaged memory, copies a variable to it, then returns the address itself.

 Dim x = 5
 Dim ptrX As IntPtr
 ptrX = Marshal.AllocHGlobal(Marshal.SizeOf(GetType(Integer)))
 Marshal.StructureToPtr(5, ptrX, False)
 Dim addressX = ptrX.ToInt64

Set the Address

Sets the pointer to the address A100 in hex.

 Dim ptrX As New IntPtr(&HA100)

Wart

<lang wart>addr.x => 27975840</lang>

addr is guaranteed to provide a stable identifier for this session. The address is just a number like any other and you can perform all the arithmetic you like on it. However, there's no way to deref an address back into a value, so this is not pointer arithmetic. The primary use of addr is to check if two objects are the same and not just copies, like Common Lisp's eq operator.

<lang wart>if (addr.x = addr.y)

 ..</lang>

As a result, wart has only one way to compare values: two objects are equal if they look the same, if they are structurally isomorphic. (You can always override it if you want a different behavior.)

X86 Assembly

For SVR4 Unix-like style assembler the address of a variable is its symbol. (On some systems the names of C language variables have an extra leading underscore.) <lang Assembler> movl my_variable, %eax</lang>

For SVR4 style code destined for a shared library it's necessary to fetch the address from the global offset table to ensure position independent code. That table is found relative to the program counter using the special _GLOBAL_OFFSET_TABLE_ (or on some systems extra leading underscore __GLOBAL_OFFSET_TABLE_). The C compiler normally does this in %ebx but for hand-crafted assembler anything equivalent is possible.

<lang Assembler> call eip_to_eax

       addl    $_GLOBAL_OFFSET_TABLE_, %eax
       movl    my_variable@GOT(%eax), %eax
       ...

eip_to_eax:

       movl    (%esp), %eax
       ret</lang>

XPL0

It is easy to get the address of a variable (relative to the beginning of its data segment), but there is no way to set the address of a variable. However, pointers can be used to access specific addresses. The example shows how the pointer B(0) is used to access the variable A and set it to hex 1234ABCD. The Peek and Poke intrinsics can be used to access specific hardware addresses. The absolute hardware address of a program's data segment can be obtained using the GetReg intrinsic. The '@' operator works exactly like 'addr' for integers but returns a 'real' pointer, instead of a 32-bit relative address, when used on a 'real' variable.

<lang XPL0>include c:\cxpl\codes; int A, B; [B:= addr A; HexOut(0, B); CrLf(0); B(0):= $1234ABCD; HexOut(0, A); CrLf(0); ]</lang>

Output:
00000F48
1234ABCD

Yorick

Yorick has pointers, but they are typically used in an opaque fashion. Pointer arithmetic is not supported, not is referencing arbitrary memory locations. However, a pointer address may be copied to other variables. Here is an interactive example that illustrates some of this.

> foo = 1
> bar = &foo
> bar
0x15f42c18
> baz = bar
> *baz = 5
> *bar
5
> *baz
5